##load all the libraries and packages that were used
# install.packages("dplyr")
# install.packages("tidyr")
# install.packages("pivottabler")
# install.packages("stringr")
library(tidyr)
## Warning: package 'tidyr' was built under R version 3.5.3
library(dplyr)
## Warning: package 'dplyr' was built under R version 3.5.3
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
library(pivottabler)
## Warning: package 'pivottabler' was built under R version 3.5.3
library(stringr)
## Warning: package 'stringr' was built under R version 3.5.3
####1
#a
#creat a vector and data frame to be used
vector1<-c(1,2,3,4,5)
frame1<-data.frame(vector1)
#b)
#export my files
#i also changed my working directory in the console
write(vector1,file = "pause")
write.table(frame1,file = "pausing")
#c)
#imported my data sets back and printed the output below
scan(file = "pause",what = integer())
## [1] 1 2 3 4 5
read.table(file = "pausing")
## vector1
## 1 1
## 2 2
## 3 3
## 4 4
## 5 5
#d)
#this is the output from scan
#Read 5 items
#[1] 1 2 3 4 5
#this is the output from read.table
#vector1
#1 1
#2 2
#3 3
#4 4
#5 5
#my different variables represent the different values for n, and the histograms approach a normal distribution
#The variable Z appears to be normal and thus shows the CLT
X<-replicate(5000,mean(rbinom(20,20,0.001)))
Y<-replicate(5000,mean(rbinom(100,20,0.001)))
Z<-replicate(5000,mean(rbinom(500,20,0.001)))
hist(X)

hist(Y)

hist(Z)

#3
#load in my table as a CSV
befAft<-read.csv("C:\\Users\\etayk\\Desktop\\advancedStatComp\\Before_after.csv",skipNul = TRUE)
#a
#an algorithm I wrote to count the number of increases
#there are 3 cases of increase, lo to med, lo to high and med to high
countincreases=function(x,y){
numInc=0
pop<-length(x)
for (i in 1:pop) {
if((x[i]=="Lo")&&(y[i]=="Med")){
numInc=numInc+1
}else if((x[i]=="Lo")&&(y[i]=="Hi")){
numInc=numInc+1
}else if((x[i]=="Med")&&(y[i]=="Hi")){
numInc=numInc+1
}
}
return(numInc)
}
bef<-as.vector(befAft$before)
aft<-as.vector(befAft$after)
countincreases(bef,aft)
## [1] 153
##found that 153 students increased levels after using the software
#b
table(befAft$before,befAft$after)
##
## Hi Lo Med
## Hi 78 42 89
## Lo 40 18 36
## Med 77 44 76
## Hi Lo Med
#Hi 78 42 89
#Lo 40 18 36
#Med 77 44 76
##this table confirms my above calculation
#c
#I could not figure out how to answer this question
?tapply
## starting httpd help server ... done
#tapply(befAft$before, levels(befAft$before), mean)
#4
#i loaded in my dataframe then created a new variable as to not alter the original
footballInfo<-read.csv("C:\\Users\\etayk\\Desktop\\advancedStatComp\\football (1).csv")
newfootballInfo<-data.frame(footballInfo)
newnew<-footballInfo
##a
ice<-as.vector(newfootballInfo[,2])
#this loop takes the year and saves it to a new vector then i appended it to the new table
#i named the new table newnew and will deal with that for the rest of the question
Game_Year<-c()
length(ice)
## [1] 1009
for (i in 1:length(ice)) {
dummy<-as.Date(ice[i])
dummyTwo<-substring(dummy,1,4)
Game_Year<-append(Game_Year,dummyTwo)
}
newnew<-append(newnew,Game_Year)
newnew$Game_Year<-as.numeric(newnew$Game_Year)
#hist((newnew$Game_Year))
#b
home<-as.vector(newnew$home_score)
away<-as.vector(newnew$away_score)
mean(home,na.rm = TRUE)
## [1] 2.287298
#2.287298
mean(away,na.rm=TRUE)
## [1] 1.752515
#1.752515
home[is.na(home)]<-0
mean(home)
## [1] 2.248761
#2.248761
away[is.na(away)]<-0
mean(away)
## [1] 1.726462
#1.726462
newnew$home_score[is.na(newnew$home_score)]<-0
newnew$away_score[is.na(newnew$away_score)]<-0
winner<-function(x,y){
c<-length(x)
homeWins<-0
for(i in 1:c){
if(x[i]>y[i]){
homeWins<-homeWins+1
}
}
return(homeWins)
}
winner(newnew$home_score,newnew$away_score)
## [1] 487
#yielded 487 home wins
##c
loc<-as.vector(newnew$location)
help("strsplit")
#algorithm i wrote to seperate the strings by , or /
seperateCityAndCountry<-function(x){
viceCity<-c()
c<-length(x)
cities<-c()
countries<-c()
for (j in 1:c) {
dumb<-strsplit(x[j],",")
check<-length(unlist(dumb))
if(check!=2){
dumb<-strsplit(x[j],"/")
}
dumber<-unlist(dumb)
cities<-append(cities,dumber[1])
countries<-append(countries,dumber[2])
}
return(cbind(cities,countries))
}
cbind(newnew,seperateCityAndCountry(loc))
## Warning in cbind(newnew, seperateCityAndCountry(loc)): number of rows of
## result is not a multiple of vector length (arg 1)
## newnew cities countries
## [1,] Integer,1009 "Glasgow" "Scotland"
## [2,] factor,1009 "London" "England"
## [3,] factor,1009 "Glasgow" "Scotland"
## [4,] factor,1009 "London" "England"
## [5,] Numeric,1009 "Glasgow" "Scotland"
## [6,] Numeric,1009 "Glasgow" "Scotland"
## [7,] factor,1009 "London" "England"
## [8,] Logical,1009 "Wrexham" "Wales"
## [9,] factor,1009 "Glasgow" "Scotland"
## [10,] factor,1009 "Glasgow" "Scotland"
## [11,] "1872" "London" "England"
## [12,] "1873" "London" "England"
## [13,] "1874" "Wrexham" "Wales"
## [14,] "1875" "Glasgow" "Scotland"
## [15,] "1876" "Wrexham" "Wales"
## [16,] "1876" "Glasgow" "Scotland"
## [17,] "1877" "Blackburn" "England"
## [18,] "1877" "London" "England"
## [19,] "1878" "Wrexham" "Wales"
## [20,] "1878" "Belfast" "Republic of Ireland"
## [21,] "1879" "Wrexham" "Wales"
## [22,] "1879" "Glasgow" "Scotland"
## [23,] "1879" "Wrexham" "Wales"
## [24,] "1880" "Glasgow" "Scotland"
## [25,] "1880" "London" "England"
## [26,] "1880" "Liverpool" "England"
## [27,] "1881" "Sheffield" "England"
## [28,] "1881" "Wrexham" "Wales"
## [29,] "1881" "Belfast" "Republic of Ireland"
## [30,] "1882" "Belfast" "Republic of Ireland"
## [31,] "1882" "Wrexham" "Wales"
## [32,] "1882" "Belfast" "Republic of Ireland"
## [33,] "1882" "Glasgow" "Scotland"
## [34,] "1882" "Wrexham" "Wales"
## [35,] "1883" "Glasgow" "Scotland"
## [36,] "1883" "Manchester" "England"
## [37,] "1883" "Blackburn" "England"
## [38,] "1883" "Glasgow" "Scotland"
## [39,] "1883" "London" "England"
## [40,] "1884" "Wrexham" "Wales"
## [41,] "1884" "Belfast" "Republic of Ireland"
## [42,] "1884" "Newark" "United States"
## [43,] "1884" "Wrexham" "Wales"
## [44,] "1884" "Belfast" "Republic of Ireland"
## [45,] "1884" "Belfast" "Republic of Ireland"
## [46,] "1885" "Glasgow" "Scotland"
## [47,] "1885" "Wrexham" "Wales"
## [48,] "1885" "Glasgow" "Scotland"
## [49,] "1885" "Newark" "United States"
## [50,] "1885" "Sheffield" "England"
## [51,] "1885" "Glasgow" "Scotland"
## [52,] "1885" "London" "England"
## [53,] "1886" "Belfast" "Republic of Ireland"
## [54,] "1886" "Blackburn" "England"
## [55,] "1886" "Wrexham" "Wales"
## [56,] "1886" "Crewe" "England"
## [57,] "1886" "Wrexham" "Wales"
## [58,] "1886" "Edinburgh" "Scotland"
## [59,] "1886" "Glasgow" "Scotland"
## [60,] "1887" "Belfast" "Republic of Ireland"
## [61,] "1887" "Belfast" "Republic of Ireland"
## [62,] "1887" "Glasgow" "Scotland"
## [63,] "1887" "Stoke-on-Trent" "England"
## [64,] "1887" "Liverpool" "England"
## [65,] "1887" "Glasgow" "Scotland"
## [66,] "1888" "London" "England"
## [67,] "1888" "Wrexham" "Wales"
## [68,] "1888" "Belfast" "Republic of Ireland"
## [69,] "1888" "Shrewsbury" "England"
## [70,] "1888" "Belfast" "Republic of Ireland"
## [71,] "1888" "Wrexham" "Wales"
## [72,] "1888" "Paisley" "Scotland"
## [73,] "1889" "Belfast" "Republic of Ireland"
## [74,] "1889" "Glasgow" "Scotland"
## [75,] "1889" "Belfast" "Republic of Ireland"
## [76,] "1889" "Sunderland" "England"
## [77,] "1889" "Wolverhampton" "England"
## [78,] "1889" "Wrexham" "Wales"
## [79,] "1890" "Glasgow" "Scotland"
## [80,] "1890" "Bangor" "Wales"
## [81,] "1890" "Belfast" "Republic of Ireland"
## [82,] "1890" "Wrexham" "Wales"
## [83,] "1890" "Belfast" "Republic of Ireland"
## [84,] "1890" "Edinburgh" "Scotland"
## [85,] "1891" "Glasgow" "Scotland"
## [86,] "1891" "Birmingham" "England"
## [87,] "1891" "Stoke-on-Trent" "England"
## [88,] "1891" "Wrexham" "Wales"
## [89,] "1891" "Glasgow" "Scotland"
## [90,] "1892" "Richmond" "England"
## [91,] "1892" "Swansea" "Wales"
## [92,] "1892" "Belfast" "Republic of Ireland"
## [93,] "1892" "Wrexham" "Wales"
## [94,] "1892" "Kilmarnock" "Scotland"
## [95,] "1892" "Belfast" "Republic of Ireland"
## [96,] "1893" "Glasgow" "Scotland"
## [97,] "1893" "Derby" "Englan"
## [98,] "1893" "Belfast" "Republic of Ireland"
## [99,] "1893" "London" "England-"
## [100,] "1893" "Wrexham" "Wales"
## [101,] "1894" "Glasgow" "Scotland"
## [102,] "1894" "Liverpool" "England"
## [103,] "1894" "Wrexham" "Wales"
## [104,] "1894" "Belfast" "Republic of Ireland"
## [105,] "1894" "Cardiff" "Wales"
## [106,] "1894" "Dundee" "Scotland"
## [107,] "1895" "Belfast" "Republic of Ireland"
## [108,] "1895" "Glasgow" "Scotland"
## [109,] "1895" "Nottingham" "Englnd"
## [110,] "1895" "Belfast" "Republic of Ireland"
## [111,] "1895" "Wrexham" "Wales"
## [112,] "1895" "Glasgow" "Scotland"
## [113,] "1896" "Sheffield" "England"
## [114,] "1896" "London" "England"
## [115,] "1896" "Llandudno" "Wales"
## [116,] "1896" "Belfast" "Republic of Ireland"
## [117,] "1896" "Motherwell" "Scotland"
## [118,] "1896" "Belfast" "Republic of Ireland"
## [119,] "1897" "Wrexham" "Wales"
## [120,] "1897" "Glasgow" "Scotland"
## [121,] "1897" "Sunderland" "Englad"
## [122,] "1897" "Belfast" "Republic of Ireland"
## [123,] "1897" "Wrexham" "Wales"
## [124,] "1897" "Bristol" "Engand"
## [125,] "1898" "Glasgow" "Scotland"
## [126,] "1898" "Birmingham" "England"
## [127,] "1898" "Aberdeen" "Scotland"
## [128,] "1898" "Llandudno" "Wales"
## [129,] "1898" "Belfast" "Republic of Ireland"
## [130,] "1898" "Dublin" "Republic of Ireland"
## [131,] "1899" "Cardiff" "Wales"
## [132,] "1899" "Glasgow" "Scotland"
## [133,] "1899" "Glasgow" "Scotland"
## [134,] "1899" "Wrexham" "Wales"
## [135,] "1899" "Southampton" "England"
## [136,] "1899" "Newcastle" "England"
## [137,] "1900" "Belfast" "Republic of Ireland"
## [138,] "1900" "London" "England"
## [139,] "1900" "Cardiff" "Wales"
## [140,] "1900" "Belfast" "Republic of Ireland"
## [141,] "1900" "Wrexham" "Wales"
## [142,] "1900" "Greenock" "Scotland"
## [143,] "1901" "Belfast" "Republic of Ireland"
## [144,] "1901" "Birmingham" "England"
## [145,] "1901" "Montevideo" "Uruguay"
## [146,] "1901" "Vienna" "Austria"
## [147,] "1901" "Portsmouth" "England"
## [148,] "1901" "Cardiff" "Wales"
## [149,] "1902" "Glasgow" "Scotland"
## [150,] "1902" "Belfast" "Republic of Ireland"
## [151,] "1902" "Sheffield" "England"
## [152,] "1902" "Budapest" "Hungary"
## [153,] "1902" "Buenos Aires" "Argentina"
## [154,] "1902" "Vienna" "Austria"
## [155,] "1902" "Wrexham" "Wales"
## [156,] "1902" "Belfast" "Republic of Ireland"
## [157,] "1903" "Dundee" "Scotland"
## [158,] "1903" "Bangor" "Wales"
## [159,] "1903" "Dublin" "Republic of Ireland"
## [160,] "1903" "Glasgow" "Scotland"
## [161,] "1903" "Brussels" "Belgium"
## [162,] "1903" "Budapest" "Hungary"
## [163,] "1903" "Paris" "France"
## [164,] "1903" "Middlesbrough" "England"
## [165,] "1904" "Wrexham" "Wales"
## [166,] "1904" "Glasgow" "Scotland"
## [167,] "1904" "Liverpool" "England"
## [168,] "1904" "London" "England"
## [169,] "1904" "Belfast" "Republic of Ireland"
## [170,] "1904" "Budapest" "Hungary"
## [171,] "1904" "Antwerp" "Belgium"
## [172,] "1904" "Brussels" "Belgium"
## [173,] "1905" "Rotterdam" "Netherlands"
## [174,] "1905" "Buenos Aires" "Argentina"
## [175,] "1905" "Belfast" "Republic of Ireland"
## [176,] "1905" "Edinburgh" "Scotland"
## [177,] "1905" "Dublin" "Republic of Ireland"
## [178,] "1905" "Cardiff" "Wales"
## [179,] "1905" "Budapest" "Hungary"
## [180,] "1905" "Wrexham" "Wales"
## [181,] "1905" "Glasgow" "Scotland"
## [182,] "1905" "Saint-Cloud" "France"
## [183,] "1905" "Antwerp" "Belgium"
## [184,] "1905" "Rotterdam" "Netherlands"
## [185,] "1906" "Montevideo" "Uruguay"
## [186,] "1906" "Prague" "Bohemia"
## [187,] "1906" "Buenos Aires" "Argentina"
## [188,] "1906" "Budapest" "Hungary"
## [189,] "1906" "Liverpool" "England"
## [190,] "1906" "Belfast" "Republic of Ireland"
## [191,] "1906" "Wrexham" "Wales"
## [192,] "1906" "Glasgow" "Scotland"
## [193,] "1906" "London" "England"
## [194,] "1906" "Newcastle" "England"
## [195,] "1906" "Budapest" "Hungary"
## [196,] "1906" "Antwerp" "Belgium"
## [197,] "1906" "Brussels" "Belgium"
## [198,] "1906" "Vienna" "Austria"
## [199,] "1907" "Haarlem" "Netherlands"
## [200,] "1907" "Prague" "Bohemia"
## [201,] "1907" "Budapest" "Hungary"
## [202,] "1907" "Belfast" "Republic of Ireland"
## [203,] "1907" "Dundee" "Scotland"
## [204,] "1907" "Geneva" "Switzerland"
## [205,] "1907" "Dublin" "Republic of Ireland"
## [206,] "1907" "Wrexham" "Wales"
## [207,] "1907" "Antwerp" "Belgium"
## [208,] "1907" "Glasgow" "Scotland"
## [209,] "1907" "Budapest" "Hungary"
## [210,] "1907" "Basel" "Switzerland"
## [211,] "1907" "Aberdare" "Wales"
## [212,] "1908" "Colombes" "France"
## [213,] "1908" "Rotterdam" "Netherlands"
## [214,] "1908" "Vienna" "Austria"
## [215,] "1908" "Rotterdam" "Netherlands"
## [216,] "1908" "Vienna" "Austria"
## [217,] "1908" "Vienna" "Austria"
## [218,] "1908" "Vienna" "Austria"
## [219,] "1908" "Budapest" "Hungary"
## [220,] "1908" "Prague" "Bohemia"
## [221,] "1908" "Gothenburg" "Sweden"
## [222,] "1908" "Montevideo" "Uruguay"
## [223,] "1908" "Buenos Aires" "Argentina"
## [224,] "1908" "Buenos Aires" "Argentina"
## [225,] "1908" "The Hague" "Netherlands"
## [226,] "1908" "Brussels" "Belgium"
## [227,] "1908" "Budapest" "Hungary"
## [228,] "1908" "Bradford" "England"
## [229,] "1908" "Wrexham" "Wales"
## [230,] "1908" "Nottingham" "England"
## [231,] "1908" "Glasgow" "Scotland"
## [232,] "1908" "Belfast" "Republic of Ireland"
## [233,] "1908" "Antwerp" "Belgium"
## [234,] "1908" "London" "England"
## [235,] "1908" "Karlsruhe" "Germany"
## [236,] "1908" "Budapest" "Hungary"
## [237,] "1908" "Rotterdam" "Netherlands"
## [238,] "1909" "Vienna" "Austria"
## [239,] "1909" "Brussels" "Belgium"
## [240,] "1909" "Budapest" "Hungary"
## [241,] "1909" "Budapest" "Hungary"
## [242,] "1909" "Budapest" "Hungary"
## [243,] "1909" "Vienna" "Austria"
## [244,] "1909" "Buenos Aires" "Argentina"
## [245,] "1909" "Montevideo" "Uruguay"
## [246,] "1909" "Buenos Aires" "Argentina"
## [247,] "1909" "Belfast" "Republic of Ireland"
## [248,] "1909" "Kilmarnock" "Scotland"
## [249,] "1909" "Antwerp" "Belgium"
## [250,] "1909" "Cardiff" "Wales"
## [251,] "1909" "Belfast" "Republic of Ireland"
## [252,] "1909" "Glasgow" "Scotland"
## [253,] "1909" "Gentilly" "France"
## [254,] "1909" "Basel" "Switzerland"
## [255,] "1909" "Haarlem" "Netherlands"
## [256,] "1909" "Wrexham" "Wales"
## [257,] "1910" "Arnhem" "Netherlands"
## [258,] "1910" "Vienna" "Austria"
## [259,] "1910" "Milan" "Italy"
## [260,] "1910" "Duisburg" "Germany"
## [261,] "1910" "Budapest" "Hungary"
## [262,] "1910" "Buenos Aires" "Argentina"
## [263,] "1910" "Buenos Aires" "Argentina"
## [264,] "1910" "Buenos Aires" "Argentina"
## [265,] "1910" "Buenos Aires" "Argentina"
## [266,] "1910" "Montevideo" "Uruguay"
## [267,] "1910" "Viña del Mar" "Chile"
## [268,] "1910" "Kristiania" "Norway"
## [269,] "1910" "Kleve" "Germany"
## [270,] "1910" "Budapest" "Hungary"
## [271,] "1910" "Buenos Aires" "Argentina"
## [272,] "1910" "Buenos Aires" "Argentina"
## [273,] "1910" "Maisons-Alfort" "France"
## [274,] "1910" "Milan" "Italy"
## [275,] "1910" "Zürich" "Switzerland"
## [276,] "1910" "Belfast" "Republic of Ireland"
## [277,] "1910" "Derby" "England"
## [278,] "1910" "Cardiff" "Wales"
## [279,] "1910" "London" "England"
## [280,] "1910" "Glasgow" "Scotland"
## [281,] "1910" "Antwerp" "Belgium"
## [282,] "1910" "Stuttgart" "Germany"
## [283,] "1911" "Liverpool" "England"
## [284,] "1911" "Dordrecht" "Netherlands"
## [285,] "1911" "Saint-Ouen" "France"
## [286,] "1911" "Liège" "Belgium"
## [287,] "1911" "Geneva" "Switzerland"
## [288,] "1911" "Uccle" "Belgium"
## [289,] "1911" "Vienna" "Austria"
## [290,] "1911" "Milan" "Italy"
## [291,] "1911" "La Chaux-de-Fonds" "Switzerland"
## [292,] "1911" "Solna" "Sweden"
## [293,] "1911" "Buenos Aires" "Argentina"
## [294,] "1911" "Solna" "Sweden"
## [295,] "1911" "Montevideo" "Uruguay"
## [296,] "1911" "Montevideo" "Uruguay"
## [297,] "1911" "Dresden" "Germany"
## [298,] "1911" "Buenos Aires" "Argentina"
## [299,] "1911" "Helsinki" "Finland"
## [300,] "1911" "Hamburg" "Germany"
## [301,] "1911" "Budapest" "Hungary"
## [302,] "1911" "Luxembourg" "Luxembourg"
## [303,] "1911" "Montevideo" "Uruguay"
## [304,] "1911" "Budapest" "Hungary"
## [305,] "1911" "Munich" "Germany"
## [306,] "1911" "Saint-Ouen" "France"
## [307,] "1911" "Dublin" "Republic of Ireland"
## [308,] "1911" "Paris" "France"
## [309,] "1911" "Saint-Ouen" "France"
## [310,] "1911" "Antwerp" "Belgium"
## [311,] "1911" "Edinburgh" "Scotland"
## [312,] "1911" "Antwerp" "Belgium"
## [313,] "1911" "Wrexham" "Wales"
## [314,] "1911" "Belfast" "Republic of Ireland"
## [315,] "1911" "Turin" "Italy"
## [316,] "1912" "Glasgow" "Scotland"
## [317,] "1912" "Zwolle" "Netherlands"
## [318,] "1912" "Cardiff" "Wales"
## [319,] "1912" "Budapest" "Hungary"
## [320,] "1912" "Dordrecht" "Netherlands"
## [321,] "1912" "Vienna" "Austria"
## [322,] "1912" "St. Gallen" "Switzerland"
## [323,] "1912" "Kristiania" "Norway"
## [324,] "1912" "Gothenburg" "Sweden"
## [325,] "1912" "Kristiania" "Norway"
## [326,] "1912" "Solna" "Sweden"
## [327,] "1912" "Stockholm" "Sweden"
## [328,] "1912" "Moscow" "Russia"
## [329,] "1912" "Moscow" "Russia"
## [330,] "1912" "Montevideo" "Uruguay"
## [331,] "1912" "Montevideo" "Uruguay"
## [332,] "1912" "Buenos Aires" "Argentina"
## [333,] "1912" "Avellaneda" "Argentina"
## [334,] "1912" "Copenhagen" "Denmark"
## [335,] "1912" "Budapest" "Hungary"
## [336,] "1912" "Gothenburg" "Sweden"
## [337,] "1912" "Leipzig" "Germany"
## [338,] "1912" "Montevideo" "Uruguay"
## [339,] "1912" "Barcelona" "Spain"
## [340,] "1912" "Genoa" "Italy"
## [341,] "1912" "Saint-Ouen" "France"
## [342,] "1912" "Belfast" "Republic of Ireland"
## [343,] "1912" "Belfast" "Republic of Ireland"
## [344,] "1912" "Brussels" "Belgium"
## [345,] "1912" "Wrexham" "Wales"
## [346,] "1912" "Antwerp" "Belgium"
## [347,] "1912" "Geneva" "Switzerland"
## [348,] "1912" "Dublin" "Republic of Ireland"
## [349,] "1912" "Bristol" "England"
## [350,] "1912" "London" "England"
## [351,] "1913" "Saint-Ouen" "France"
## [352,] "1913" "Zwolle" "Netherlands"
## [353,] "1913" "Vienna" "Austria"
## [354,] "1913" "Turin" "Italy"
## [355,] "1913" "Moscow" "Russia"
## [356,] "1913" "Basel" "Switzerland"
## [357,] "1913" "Freiburg" "Germany"
## [358,] "1913" "Budapest" "Hungary"
## [359,] "1913" "Copenhagen" "Denmark"
## [360,] "1913" "Stockholm" "Sweden"
## [361,] "1913" "Avellaneda" "Argentina"
## [362,] "1913" "Vienna" "Austria"
## [363,] "1913" "Avellaneda" "Argentina"
## [364,] "1913" "Avellaneda" "Argentina"
## [365,] "1913" "Buenos Aires" "Argentina"
## [366,] "1913" "Moscow" "Russia"
## [367,] "1913" "Viña del Mar" "Chile"
## [368,] "1913" "Stockholm" "Sweden"
## [369,] "1913" "Montevideo" "Uruguay"
## [370,] "1913" "Hamburg" "Germany"
## [371,] "1913" "Budapest" "Hungary"
## [372,] "1913" "Kristiania" "Norway"
## [373,] "1913" "Montevideo" "Uruguay"
## [374,] "1913" "Verviers" "Belgium"
## [375,] "1913" "Antwerp" "Belgium"
## [376,] "1913" "Milan" "Italy"
## [377,] "1913" "Wrexham" "Wales"
## [378,] "1913" "Lille" "France"
## [379,] "1913" "Luxembourg" "Luxembourg"
## [380,] "1913" "Middlesbrough" "England"
## [381,] "1913" "Glasgow" "Scotland"
## [382,] "1913" "Saint-Ouen" "France"
## [383,] "1913" "Belfast" "Republic of Ireland"
## [384,] "1913" "Antwerp" "Belgium"
## [385,] "1913" "Cardiff" "Wales"
## [386,] "1914" "Turin" "Italy"
## [387,] "1914" "Genoa" "Italy"
## [388,] "1914" "Amsterdam" "Netherlands"
## [389,] "1914" "Amsterdam" "Netherlands"
## [390,] "1914" "Vienna" "Austria"
## [391,] "1914" "Copenhagen" "Denmark"
## [392,] "1914" "Berne" "Switzerland"
## [393,] "1914" "Solna" "Sweden"
## [394,] "1914" "Budapest" "Hungary"
## [395,] "1914" "Solna" "Sweden"
## [396,] "1914" "Kristiania" "Norway"
## [397,] "1914" "Solna" "Sweden"
## [398,] "1914" "Kristiania" "Norway"
## [399,] "1914" "Montevideo" "Uruguay"
## [400,] "1914" "Buenos Aires" "Argentina"
## [401,] "1914" "Buenos Aires" "Argentina"
## [402,] "1914" "Buenos Aires" "Argentina"
## [403,] "1914" "Budapest" "Hungary"
## [404,] "1914" "Solna" "Sweden"
## [405,] "1914" "Vienna" "Austria"
## [406,] "1914" "Bilbao" "Spain"
## [407,] "1914" "Turin" "Italy"
## [408,] "1914" "Barcelona" "Spain"
## [409,] "1914" "Budapest" "Hungary"
## [410,] "1914" "Madrid" "Spain"
## [411,] "1914" "Vienna" "Austria"
## [412,] "1914" "Copenhagen" "Denmark"
## [413,] "1914" "Kristiania" "Norway"
## [414,] "1914" "Montevideo" "Uruguay"
## [415,] "1914" "Buenos Aires" "Argentina"
## [416,] "1915" "Montevideo" "Uruguay"
## [417,] "1915" "Copenhagen" "Denmark"
## [418,] "1915" "Vienna" "Austria"
## [419,] "1915" "Stockholm" "Sweden"
## [420,] "1915" "Stockholm" "Sweden"
## [421,] "1915" "Budapest" "Hungary"
## [422,] "1915" "Vienna" "Austria"
## [423,] "1915" "Barcelona" "Spain"
## [424,] "1915" "Barcelona" "Spain"
## [425,] "1915" "Copenhagen" "Denmark"
## [426,] "1915" "Budapest" "Hungary"
## [427,] "1915" "Bilbao" "Spain"
## [428,] "1915" "Kristiania" "Norway"
## [429,] "1915" "Buenos Aires" "Argentina"
## [430,] "1915" "Stockholm" "Sweden"
## [431,] "1915" "Buenos Aires" "Argentina"
## [432,] "1916" "Buenos Aires" "Argentina"
## [433,] "1916" "Buenos Aires" "Argentina"
## [434,] "1916" "Buenos Aires" "Argentina"
## [435,] "1916" "Buenos Aires" "Argentina"
## [436,] "1916" "Montevideo" "Uruguay"
## [437,] "1916" "Avellaneda" "Argentina"
## [438,] "1916" "Montevideo" "Uruguay"
## [439,] "1916" "Avellaneda" "Argentina"
## [440,] "1916" "Montevideo" "Uruguay"
## [441,] "1916" "Stockholm" "Sweden"
## [442,] "1916" "Kristiania" "Norway"
## [443,] "1916" "Avellaneda" "Argentina"
## [444,] "1916" "Budapest" "Hungary"
## [445,] "1916" "Kristiania" "Norway"
## [446,] "1916" "Montevideo" "Uruguay"
## [447,] "1916" "Stockholm" "Sweden"
## [448,] "1916" "Copenhagen" "Denmark"
## [449,] "1916" "Montevideo" "Uruguay"
## [450,] "1916" "Vienna" "Austria"
## [451,] "1916" "Vienna" "Austria"
## [452,] "1916" "Tokyo" "Japan"
## [453,] "1916" "Copenhagen" "Denmark"
## [454,] "1916" "Budapest" "Hungary"
## [455,] "1916" "Kristiania" "Norway"
## [456,] "1916" "Vienna" "Austria"
## [457,] "1916" "Montevideo" "Uruguay"
## [458,] "1916" "Avellaneda" "Argentina"
## [459,] "1916" "Helsingborg" "Sweden"
## [460,] "1916" "Montevideo" "Uruguay"
## [461,] "1917" "Kristiania" "Norway"
## [462,] "1917" "Montevideo" "Uruguay"
## [463,] "1917" "Montevideo" "Uruguay"
## [464,] "1917" "Montevideo" "Uruguay"
## [465,] "1917" "Copenhagen" "Denmark"
## [466,] "1917" "Budapest" "Hungary"
## [467,] "1917" "Montevideo" "Uruguay"
## [468,] "1917" "Montevideo" "Uruguay"
## [469,] "1917" "Stockholm" "Sweden"
## [470,] "1917" "Montevideo" "Uruguay"
## [471,] "1917" "Montevideo" "Uruguay"
## [472,] "1917" "Vienna" "Austria"
## [473,] "1917" "Basel" "Switzerland"
## [474,] "1917" "Zürich" "Switzerland"
## [475,] "1917" "Budapest" "Hungary"
## [476,] "1917" "Vienna" "Austria"
## [477,] "1917" "Budapest" "Hungary"
## [478,] "1917" "Stockholm" "Sweden"
## [479,] "1917" "Vienna" "Austria"
## [480,] "1917" "Copenhagen" "Denmark"
## [481,] "1917" "Kristiania" "Norway"
## [482,] "1917" "Montevideo" "Uruguay"
## [483,] "1917" "Montevideo" "Uruguay"
## [484,] "1917" "Buenos Aires" "Argentina"
## [485,] "1918" "Buenos Aires" "Argentina"
## [486,] "1918" "Kristiania" "Norway"
## [487,] "1918" "Montevideo" "Uruguay"
## [488,] "1918" "Buenos Aires" "Argentina"
## [489,] "1918" "Vienna" "Austria"
## [490,] "1918" "Copenhagen" "Denmark"
## [491,] "1918" "Gothenburg" "Sweden"
## [492,] "1918" "Brussels" "Belgium"
## [493,] "1918" "Budapest" "Hungary"
## [494,] "1918" "Rio de Janeiro" "Brazil"
## [495,] "1918" "Asunción" "Paraguay"
## [496,] "1918" "Rio de Janeiro" "Brazil"
## [497,] "1918" "Asunción" "Paraguay"
## [498,] "1918" "Rio de Janeiro" "Brazil"
## [499,] "1918" "Rio de Janeiro" "Brazil"
## [500,] "1918" "Asunción" "Paraguay"
## [501,] "1918" "Rio de Janeiro" "Brazil"
## [502,] "1919" "Asunción" "Paraguay"
## [503,] "1919" "Rio de Janeiro" "Brazil"
## [504,] "1919" "Rio de Janeiro" "Brazil"
## [505,] "1919" "Stockholm" "Sweden"
## [506,] "1919" "Rio de Janeiro" "Brazil"
## [507,] "1919" "Copenhagen" "Denmark"
## [508,] "1919" "Amsterdam" "Netherlands"
## [509,] "1919" "Copenhagen" "Denmark"
## [510,] "1919" "Kristiania" "Norway"
## [511,] "1919" "Montevideo" "Uruguay"
## [512,] "1919" "Stockholm" "Sweden"
## [513,] "1919" "Montevideo" "Uruguay"
## [514,] "1919" "Oslo" "Norway"
## [515,] "1919" "Buenos Aires" "Argentina"
## [516,] "1919" "Gothenburg" "Sweden"
## [517,] "1919" "Kristiania" "Norway"
## [518,] "1919" "Helsinki" "Finland"
## [519,] "1919" "Vienna" "Austria"
## [520,] "1919" "Stockholm" "Sweden"
## [521,] "1919" "Buenos Aires" "Argentina"
## [522,] "1919" "Belfast" "Republic of Ireland"
## [523,] "1919" "Budapest" "Hungary"
## [524,] "1919" "Montevideo" "Uruguay"
## [525,] "1919" "Milan" "Italy"
## [526,] "1919" "Belfast" "Republic of Ireland"
## [527,] "1919" "Cardiff" "Wales"
## [528,] "1919" "Geneva" "Switzerland"
## [529,] "1919" "Glasgow" "Scotland"
## [530,] "1919" "London" "England"
## [531,] "1919" "Paris" "France"
## [532,] "1919" "Berne" "Switzerland"
## [533,] "1919" "Amsterdam" "Netherlands"
## [534,] "1919" "Sheffield" "England"
## [535,] "1920" "Vienna" "Austria"
## [536,] "1920" "Genoa" "Italy"
## [537,] "1920" "Basel" "Switzerland"
## [538,] "1920" "Stockholm" "Sweden"
## [539,] "1920" "Stockholm" "Sweden"
## [540,] "1920" "Kristiania" "Norway"
## [541,] "1920" "Kristiania" "Norway"
## [542,] "1920" "Zürich" "Switzerland"
## [543,] "1920" "Montevideo" "Uruguay"
## [544,] "1920" "Buenos Aires" "Argentina"
## [545,] "1920" "Buenos Aires" "Argentina"
## [546,] "1920" "Viña del Mar" "Chile"
## [547,] "1920" "Viña del Mar" "Chile"
## [548,] "1920" "Viña del Mar" "Chile"
## [549,] "1920" "Helsinki" "Finland"
## [550,] "1920" "Viña del Mar" "Chile"
## [551,] "1920" "Viña del Mar" "Chile"
## [552,] "1920" "Vienna" "Austria"
## [553,] "1920" "Stockholm" "Sweden"
## [554,] "1920" "Viña del Mar" "Chile"
## [555,] "1920" "Stockholm" "Sweden"
## [556,] "1920" "Helsinki" "Finland"
## [557,] "1920" "Sunderland" "England"
## [558,] "1920" "Berlin" "Germany"
## [559,] "1920" "Budapest" "Hungary"
## [560,] "1920" "Aberdeen" "Scotland"
## [561,] "1920" "Marseille" "France"
## [562,] "1920" "Belfast" "Republic of Ireland"
## [563,] "1920" "Forest" "Belgium"
## [564,] "1920" "Milan" "Italy"
## [565,] "1920" "Cardiff" "Wales"
## [566,] "1920" "Vienna" "Austria"
## [567,] "1920" "Barcelona" "Spain"
## [568,] "1920" "Barcelona" "Spain"
## [569,] "1920" "Asunción" "Paraguay"
## [570,] "1921" "Glasgow" "Scotland"
## [571,] "1921" "Swansea" "Wales"
## [572,] "1921" "Asunción" "Paraguay"
## [573,] "1921" "Vienna" "Austria"
## [574,] "1921" "St. Gallen" "Switzerland"
## [575,] "1921" "Antwerp" "Belgium"
## [576,] "1921" "Dresden" "Germany"
## [577,] "1921" "Amsterdam" "Netherlands"
## [578,] "1921" "Antwerp" "Belgium"
## [579,] "1921" "Brussels" "Belgium"
## [580,] "1921" "Kristiania" "Norway"
## [581,] "1921" "Stockholm" "Sweden"
## [582,] "1921" "Shanghai" "China PR"
## [583,] "1921" "Budapest" "Hungary"
## [584,] "1921" "Copenhagen" "Denmark"
## [585,] "1921" "Kristiania" "Norway"
## [586,] "1921" "Montréal" "Canada"
## [587,] "1921" "Tallinn" "Estonia"
## [588,] "1921" "Stockholm" "Sweden"
## [589,] "1921" "Helsinki" "Finland"
## [590,] "1921" "Tallinn" "Estonia"
## [591,] "1921" "Guatemala" "Guatemala"
## [592,] "1921" "Helsinki" "Finland"
## [593,] "1921" "Guatemala" "Guatemala"
## [594,] "1921" "Stockholm" "Sweden"
## [595,] "1921" "Viña del Mar" "Chile"
## [596,] "1921" "Buenos Aires" "Argentina"
## [597,] "1921" "Santiago" "Chile"
## [598,] "1921" "Copenhagen" "Denmark"
## [599,] "1921" "Buenos Aires" "Argentina"
## [600,] "1921" "Stockholm" "Sweden"
## [601,] "1921" "Buenos Aires" "Argentina"
## [602,] "1921" "Buenos Aires" "Argentina"
## [603,] "1921" "Belfast" "Republic of Ireland"
## [604,] "1921" "Buenos Aires" "Argentina"
## [605,] "1921" "Prague" "Czechoslovakia"
## [606,] "1921" "Buenos Aires" "Argentina"
## [607,] "1921" "Montevideo" "Uruguay"
## [608,] "1921" "Budapest" "Hungary"
## [609,] "1921" "Geneva" "Switzerland"
## [610,] "1921" "Prague" "Czechoslovakia"
## [611,] "1921" "Vincennes" "France"
## [612,] "1921" "Budapest" "Hungary"
## [613,] "1921" "Madrid" "Spain"
## [614,] "1921" "Colombes" "France"
## [615,] "1921" "Milan" "Italy"
## [616,] "1921" "Wrexham" "Wales"
## [617,] "1921" "Turin" "Italy"
## [618,] "1921" "Glasgow" "Scotland"
## [619,] "1921" "Rennes" "France"
## [620,] "1921" "Liverpool" "England"
## [621,] "1921" "Antwerp" "Belgium"
## [622,] "1921" "Frankfurt am Main" "Germany"
## [623,] "1921" "Birmingham" "England"
## [624,] "1922" "Liège" "Belgium"
## [625,] "1922" "Amsterdam" "Netherlands"
## [626,] "1922" "Vienna" "Austria"
## [627,] "1922" "Le Bouscat" "France"
## [628,] "1922" "Budapest" "Hungary"
## [629,] "1922" "Amsterdam" "Netherlands"
## [630,] "1922" "Cracow" "Poland"
## [631,] "1922" "Milan" "Italy"
## [632,] "1922" "Bergen" "Norway"
## [633,] "1922" "Stockholm" "Sweden"
## [634,] "1922" "Helsinki" "Finland"
## [635,] "1922" "Belgrade" "Yugoslavia"
## [636,] "1922" "Vienna" "Austria"
## [637,] "1922" "Copenhagen" "Denmark"
## [638,] "1922" "Kristiania" "Norway"
## [639,] "1922" "Budapest" "Hungary"
## [640,] "1922" "Dunedin" "New Zealand"
## [641,] "1922" "Wellington" "New Zealand"
## [642,] "1922" "Zagreb" "Yugoslavia"
## [643,] "1922" "Bochum" "Germany"
## [644,] "1922" "Auckland" "New Zealand"
## [645,] "1922" "Stockholm" "Sweden"
## [646,] "1922" "Helsinki" "Finland"
## [647,] "1922" "Helsinki" "Finland"
## [648,] "1922" "Stockholm" "Sweden"
## [649,] "1922" "Stockholm" "Sweden"
## [650,] "1922" "Helsinki" "Finland"
## [651,] "1922" "Cernăuţi" "Romania"
## [652,] "1922" "Fredrikstad" "Norway"
## [653,] "1922" "Rio de Janeiro" "Brazil"
## [654,] "1922" "Rio de Janeiro" "Brazil"
## [655,] "1922" "Vienna" "Austria"
## [656,] "1922" "Rio de Janeiro" "Brazil"
## [657,] "1922" "Riga" "Latvia"
## [658,] "1922" "Kristiania" "Norway"
## [659,] "1922" "Rio de Janeiro" "Brazil"
## [660,] "1922" "Rio de Janeiro" "Brazil"
## [661,] "1922" "Copenhagen" "Denmark"
## [662,] "1922" "Zagreb" "Yugoslavia"
## [663,] "1922" "Rio de Janeiro" "Brazil"
## [664,] "1922" "Rio de Janeiro" "Brazil"
## [665,] "1922" "Rio de Janeiro" "Brazil"
## [666,] "1922" "Rio de Janeiro" "Brazil"
## [667,] "1922" "Rio de Janeiro" "Brazil"
## [668,] "1922" "West Bromwich" "England"
## [669,] "1922" "Buenos Aires" "Argentina"
## [670,] "1922" "Rio de Janeiro" "Brazil"
## [671,] "1922" "São Paulo" "Brazil"
## [672,] "1922" "São Paulo" "Brazil"
## [673,] "1922" "Montevideo" "Uruguay"
## [674,] "1922" "Berne" "Switzerland"
## [675,] "1922" "Vigo" "Spain"
## [676,] "1922" "Budapest" "Hungary"
## [677,] "1922" "Bologna" "Italy"
## [678,] "1922" "Montevideo" "Uruguay"
## [679,] "1922" "Buenos Aires" "Argentina"
## [680,] "1922" "Lisbon" "Portugal"
## [681,] "1922" "Guatemala" "Guatemala"
## [682,] "1922" "Milan" "Italy"
## [683,] "1922" "Guatemala" "Guatemala"
## [684,] "1922" "Guatemala" "Guatemala"
## [685,] "1922" "Seville" "Spain"
## [686,] "1922" "Geneva" "Switzerland"
## [687,] "1922" "San Sebastián" "Spain"
## [688,] "1922" "Antwerp" "Belgium"
## [689,] "1922" "Esch-sur-Alzette" "Luxembourg"
## [690,] "1922" "Forest" "Belgium"
## [691,] "1923" "Vigo" "Spain"
## [692,] "1923" "Belfast" "Northern Ireland"
## [693,] "1923" "Genoa" "Italy"
## [694,] "1923" "Cardiff" "Wales"
## [695,] "1923" "Lausanne" "Switzerland"
## [696,] "1923" "Paisley" "Scotland"
## [697,] "1923" "London" "England"
## [698,] "1923" "Amsterdam" "Netherlands"
## [699,] "1923" "Glasgow" "Scotland"
## [700,] "1923" "Wrexham" "Wales"
## [701,] "1923" "Vienna" "Austria"
## [702,] "1923" "Vincennes" "France"
## [703,] "1923" "Amsterdam" "Netherlands"
## [704,] "1923" "Vienna" "Austria"
## [705,] "1923" "Prague" "Czechoslovakia"
## [706,] "1923" "Vincennes" "France"
## [707,] "1923" "Hamburg" "Germany"
## [708,] "1923" "Buenos Aires" "Argentina"
## [709,] "1923" "Stockholm" "Sweden"
## [710,] "1923" "Osaka" "Japan"
## [711,] "1923" "Osaka" "Japan"
## [712,] "1923" "Solna" "Sweden"
## [713,] "1923" "Buenos Aires" "Argentina"
## [714,] "1923" "Prague" "Czechoslovakia"
## [715,] "1923" "Cracow" "Poland"
## [716,] "1923" "Basel" "Switzerland"
## [717,] "1923" "Brisbane" "Australia"
## [718,] "1923" "Bucharest" "Romania"
## [719,] "1923" "Gothenburg" "Sweden"
## [720,] "1923" "Sydney" "Australia"
## [721,] "1923" "Copenhagen" "Denmark"
## [722,] "1923" "Kristiania" "Norway"
## [723,] "1923" "Gävle" "Sweden"
## [724,] "1923" "Kristiania" "Norway"
## [725,] "1923" "Buenos Aires" "Argentina"
## [726,] "1923" "Kaunas" "Lithuania"
## [727,] "1923" "Stockholm" "Sweden"
## [728,] "1923" "Newcastle" "Australia"
## [729,] "1923" "Cluj" "Romania"
## [730,] "1923" "Buenos Aires" "Argentina"
## [731,] "1923" "Montevideo" "Uruguay"
## [732,] "1923" "Tallinn" "Estonia"
## [733,] "1923" "Dresden" "Germany"
## [734,] "1923" "Vienna" "Austria"
## [735,] "1923" "Budapest" "Hungary"
## [736,] "1923" "Lwów" "Poland"
## [737,] "1923" "Kristiania" "Norway"
## [738,] "1923" "Tallinn" "Estonia"
## [739,] "1923" "Helsinki" "Finland"
## [740,] "1923" "Budapest" "Hungary"
## [741,] "1923" "Tallinn" "Estonia"
## [742,] "1923" "Copenhagen" "Denmark"
## [743,] "1923" "Tallinn" "Estonia"
## [744,] "1923" "Montevideo" "Uruguay"
## [745,] "1923" "Stockholm" "Sweden"
## [746,] "1923" "Belfast" "Northern Ireland"
## [747,] "1923" "Istanbul" "Turkey"
## [748,] "1923" "Prague" "Czechoslovakia"
## [749,] "1923" "Paris" "France"
## [750,] "1923" "Budapest" "Hungary"
## [751,] "1923" "Montevideo" "Uruguay"
## [752,] "1923" "Antwerp" "Belgium"
## [753,] "1923" "Cracow" "Poland"
## [754,] "1923" "Rennes" "France"
## [755,] "1923" "Hamburg" "Germany"
## [756,] "1923" "Montevideo" "Uruguay"
## [757,] "1923" "Montevideo" "Uruguay"
## [758,] "1923" "Montevideo" "Uruguay"
## [759,] "1923" "Montevideo" "Uruguay"
## [760,] "1923" "Amsterdam" "Netherlands"
## [761,] "1923" "Montevideo" "Uruguay"
## [762,] "1923" "Madrid" "Spain"
## [763,] "1923" "Buenos Aires" "Argentina"
## [764,] "1923" "Montevideo" "Uruguay"
## [765,] "1923" "Buenos Aires" "Argentina"
## [766,] "1923" "Buenos Aires" "Argentina"
## [767,] "1923" "Mexico City" "Mexico"
## [768,] "1923" "Mexico City" "Mexico"
## [769,] "1923" "Mexico City" "Mexico"
## [770,] "1923" "Seville" "Spain"
## [771,] "1923" "Montrouge" "France"
## [772,] "1923" "Nuremberg" "Germany"
## [773,] "1923" "Genoa" "Italy"
## [774,] "1923" "Zagreb" "Yugoslavia"
## [775,] "1923" "Cardiff" "Wales"
## [776,] "1923" "Glasgow" "Scotland"
## [777,] "1923" "Blackburn" "England"
## [778,] "1923" "Milan" "Italy"
## [779,] "1923" "Barcelona" "Spain"
## [780,] "1923" "Belfast" "Northern Ireland"
## [781,] "1924" "Amsterdam" "Netherlands"
## [782,] "1924" "Geneva" "Switzerland"
## [783,] "1924" "Rennes" "France"
## [784,] "1924" "Oranjestad" "Aruba"
## [785,] "1924" "Budapest" "Hungary"
## [786,] "1924" "London" "England"
## [787,] "1924" "Amsterdam" "Netherlands"
## [788,] "1924" "Basel" "Switzerland"
## [789,] "1924" "Antwerp" "Belgium"
## [790,] "1924" "Budapest" "Hungary"
## [791,] "1924" "Asunción" "Paraguay"
## [792,] "1924" "Vincennes" "France"
## [793,] "1924" "Asunción" "Paraguay"
## [794,] "1924" "Stockholm" "Sweden"
## [795,] "1924" "Zürich" "Switzerland"
## [796,] "1924" "Vienna" "Austria"
## [797,] "1924" "Vienna" "Austria"
## [798,] "1924" "Buenos Aires" "Argentina"
## [799,] "1924" "Montevideo" "Uruguay"
## [800,] "1924" "Vincennes" "France"
## [801,] "1924" "Le Havre" "France"
## [802,] "1924" "Brisbane" "Australia"
## [803,] "1924" "Warsaw" "Poland"
## [804,] "1924" "Sydney" "Australia"
## [805,] "1924" "Copenhagen" "Denmark"
## [806,] "1924" "Kristiania" "Norway"
## [807,] "1924" "Barcelona" "Spain"
## [808,] "1924" "Helsinki" "Finland"
## [809,] "1924" "Tallinn" "Estonia"
## [810,] "1924" "Vienna" "Austria"
## [811,] "1924" "Riga" "Latvia"
## [812,] "1924" "Sydney" "Australia"
## [813,] "1924" "Newcastle" "Australia"
## [814,] "1924" "Å\201ódź" "Poland"
## [815,] "1924" "Stockholm" "Sweden"
## [816,] "1924" "Adelaide" "Australia"
## [817,] "1924" "Stockholm" "Sweden"
## [818,] "1924" "Sydney" "Australia"
## [819,] "1924" "Helsinki" "Finland"
## [820,] "1924" "Warsaw" "Poland"
## [821,] "1924" "Riga" "Latvia"
## [822,] "1924" "Helsinki" "Finland"
## [823,] "1924" "Tallinn" "Estonia"
## [824,] "1924" "Prague" "Czechoslovakia"
## [825,] "1924" "Berlin" "Germany"
## [826,] "1924" "Budapest" "Hungary"
## [827,] "1924" "Vienna" "Austria"
## [828,] "1924" "Helsinki" "Finland"
## [829,] "1924" "Kristiania" "Norway"
## [830,] "1924" "Budapest" "Hungary"
## [831,] "1924" "Solna" "Sweden"
## [832,] "1924" "Montevideo" "Uruguay"
## [833,] "1924" "Belfast" "Northern Ireland"
## [834,] "1924" "Zagreb" "Yugoslavia"
## [835,] "1924" "Buenos Aires" "Argentina"
## [836,] "1924" "Copenhagen" "Denmark"
## [837,] "1924" "Montevideo" "Uruguay"
## [838,] "1924" "Riga" "Latvia"
## [839,] "1924" "Montevideo" "Uruguay"
## [840,] "1924" "Liverpool" "England"
## [841,] "1924" "Montevideo" "Uruguay"
## [842,] "1924" "Montevideo" "Uruguay"
## [843,] "1924" "Montevideo" "Uruguay"
## [844,] "1924" "Amsterdam" "Netherlands"
## [845,] "1924" "Montevideo" "Uruguay"
## [846,] "1924" "Vienna" "Austria"
## [847,] "1924" "Brussels" "Belgium"
## [848,] "1924" "Milan" "Italy"
## [849,] "1924" "Moscow" "Soviet Union"
## [850,] "1924" "Duisburg" "Germany"
## [851,] "1924" "West Bromwich" "England"
## [852,] "1924" "Stuttgart" "Germany"
## [853,] "1924" "Barcelona" "Spain"
## [854,] "1924" "Edinburgh" "Scotland"
## [855,] "1924" "Luxembourg" "Luxembourg"
## [856,] "1924" "Belfast" "Northern Ireland"
## [857,] "1924" "Swansea" "Wales"
## [858,] "1924" "Antwerp" "Belgium"
## [859,] "1924" "Vienna" "Austria"
## [860,] "1924" "Port-au-Prince" "Haiti"
## [861,] "1924" "Turin" "Italy"
## [862,] "1924" "Budapest" "Hungary"
## [863,] "1924" "Port-au-Prince" "Haiti"
## [864,] "1925" "Port-au-Prince" "Haiti"
## [865,] "1925" "Amsterdam" "Netherlands"
## [866,] "1925" "Glasgow" "Scotland"
## [867,] "1925" "Istanbul" "Turkey"
## [868,] "1925" "Wrexham" "Wales"
## [869,] "1925" "Vincennes" "France"
## [870,] "1925" "Zürich" "Switzerland"
## [871,] "1925" "Bucharest" "Romania"
## [872,] "1925" "Amsterdam" "Netherlands"
## [873,] "1925" "Vienna" "Austria"
## [874,] "1925" "Ankara" "Turkey"
## [875,] "1925" "Manila" "Philippines"
## [876,] "1925" "Colombes" "France"
## [877,] "1925" "Budapest" "Hungary"
## [878,] "1925" "Manila" "Philippines"
## [879,] "1925" "Prague" "Czechoslovakia"
## [880,] "1925" "Lausanne" "Switzerland"
## [881,] "1925" "Sofia" "Bulgaria"
## [882,] "1925" "Berne" "Switzerland"
## [883,] "1925" "Oslo" "Norway"
## [884,] "1925" "Gothenburg" "Sweden"
## [885,] "1925" "Valencia" "Spain"
## [886,] "1925" "Stockholm" "Sweden"
## [887,] "1925" "Lisbon" "Portugal"
## [888,] "1925" "Copenhagen" "Denmark"
## [889,] "1925" "Stockholm" "Sweden"
## [890,] "1925" "Helsinki" "Finland"
## [891,] "1925" "Montréal" "Canada"
## [892,] "1925" "Kaunas" "Lithuania"
## [893,] "1925" "Tallinn" "Estonia"
## [894,] "1925" "Stockholm" "Sweden"
## [895,] "1925" "Buenos Aires" "Argentina"
## [896,] "1925" "Helsinki" "Finland"
## [897,] "1925" "Buenos Aires" "Argentina"
## [898,] "1925" "Stockholm" "Sweden"
## [899,] "1925" "Montevideo" "Uruguay"
## [900,] "1925" "Montevideo" "Uruguay"
## [901,] "1925" "Cracow" "Poland"
## [902,] "1925" "Helsinki" "Finland"
## [903,] "1925" "Asunción" "Paraguay"
## [904,] "1925" "Asunción" "Paraguay"
## [905,] "1925" "Oslo" "Norway"
## [906,] "1925" "Asunción" "Paraguay"
## [907,] "1925" "Tallinn" "Estonia"
## [908,] "1925" "Helsinki" "Finland"
## [909,] "1925" "Budapest" "Hungary"
## [910,] "1925" "Riga" "Latvia"
## [911,] "1925" "Vienna" "Austria"
## [912,] "1925" "Ã…rhus" "Denmark"
## [913,] "1925" "Istanbul" "Turkey"
## [914,] "1925" "Budapest" "Hungary"
## [915,] "1925" "Prague" "Czechoslovakia"
## [916,] "1925" "Belfast" "Northern Ireland"
## [917,] "1925" "Amsterdam" "Netherlands"
## [918,] "1925" "Basel" "Switzerland"
## [919,] "1925" "Prague" "Czechoslovakia"
## [920,] "1925" "Cardiff" "Wales"
## [921,] "1925" "Cracow" "Poland"
## [922,] "1925" "Padua" "Italy"
## [923,] "1925" "Budapest" "Hungary"
## [924,] "1925" "Berne" "Switzerland"
## [925,] "1925" "New York" "United States"
## [926,] "1925" "Buenos Aires" "Argentina"
## [927,] "1925" "Buenos Aires" "Argentina"
## [928,] "1925" "Buenos Aires" "Argentina"
## [929,] "1925" "Liège" "Belgium"
## [930,] "1925" "Barcelona" "Spain"
## [931,] "1925" "Buenos Aires" "Argentina"
## [932,] "1925" "Buenos Aires" "Argentina"
## [933,] "1925" "Buenos Aires" "Argentina"
## [934,] "1925" "Turin" "Italy"
## [935,] "1925" "Port-au-Prince" "Haiti"
## [936,] "1925" "Port-au-Prince" "Haiti"
## [937,] "1925" "Port-au-Prince" "Haiti"
## [938,] "1925" "Belfast" "Northern Ireland"
## [939,] "1925" "Brussels" "Belgium"
## [940,] "1925" "Port-au-Prince" "Haiti"
## [941,] "1925" "Glasgow" "Scotland"
## [942,] "1925" "London" "England"
## [943,] "1925" "Kingston" "Jamaica"
## [944,] "1926" "Vienna" "Austria"
## [945,] "1926" "Antwerp" "Belgium"
## [946,] "1926" "Turin" "Italy"
## [947,] "1926" "Amsterdam" "Netherlands"
## [948,] "1926" "Vincennes" "France"
## [949,] "1926" "Manchester" "England"
## [950,] "1926" "Toulouse" "France"
## [951,] "1926" "Düsseldorf" "Germany"
## [952,] "1926" "Zürich" "Switzerland"
## [953,] "1926" "Colombes" "France"
## [954,] "1926" "Bucharest" "Romania"
## [955,] "1926" "Nairobi" "Kenya"
## [956,] "1926" "Budapest" "Hungary"
## [957,] "1926" "Amsterdam" "Netherlands"
## [958,] "1926" "Nairobi" "Kenya"
## [959,] "1926" "Istanbul" "Turkey"
## [960,] "1926" "Milan" "Italy"
## [961,] "1926" "Antwerp" "Belgium"
## [962,] "1926" "Buenos Aires" "Argentina"
## [963,] "1926" "Vienna" "Austria"
## [964,] "1926" "Zagreb" "Yugoslavia"
## [965,] "1926" "Buenos Aires" "Argentina"
## [966,] "1926" "Helsinki" "Finland"
## [967,] "1926" "Budapest" "Hungary"
## [968,] "1926" "Stockholm" "Sweden"
## [969,] "1926" "Copenhagen" "Denmark"
## [970,] "1926" "Tallinn" "Estonia"
## [971,] "1926" "Colombes" "France"
## [972,] "1926" "Stockholm" "Sweden"
## [973,] "1926" "Brussels" "Belgium"
## [974,] "1926" "Helsinki" "Finland"
## [975,] "1926" "Nuremberg" "Germany"
## [976,] "1926" "Zagreb" "Yugoslavia"
## [977,] "1926" "Prague" "Czechoslovakia"
## [978,] "1926" "Warsaw" "Poland"
## [979,] "1926" "Prague" "Czech Republic"
## [980,] "1926" "Stockholm" "Sweden"
## [981,] "1926" "Riga" "Latvia"
## [982,] "1926" "Tallinn" "Estonia"
## [983,] "1926" "Helsinki" "Finland"
## [984,] "1926" "Poznań" "Poland"
## [985,] "1926" "Riga" "Latvia"
## [986,] "1926" "Budapest" "Hungary"
## [987,] "1926" "Kaunas" "Lithuania"
## [988,] "1926" "Helsinki" "Finland"
## [989,] "1926" "Lwów" "Poland"
## [990,] "1926" "Vienna" "Austria"
## [991,] "1926" "Riga" "Latvia"
## [992,] "1926" "Oslo" "Norway"
## [993,] "1926" "Prague" "Czechoslovakia"
## [994,] "1926" "Copenhagen" "Denmark"
## [995,] "1926" "Stockholm" "Sweden"
## [996,] "1926" "Zagreb" "Yugoslavia"
## [997,] "1926" "Vienna" "Austria"
## [998,] "1926" "Santiago" "Chile"
## [999,] "1926" "Santiago" "Chile"
## [1000,] "1926" "Santiago" "Chile"
## [1001,] "1926" "Santiago" "Chile"
## [1002,] "1926" "Liverpool" "England"
## [1003,] "1926" "Santiago" "Chile"
## [1004,] "1926" "Santiago" "Chile"
## [1005,] "1926" "Santiago" "Chile"
## [1006,] "1926" "Prague" "Czechoslovakia"
## [1007,] "1926" "Glasgow" "Scotland"
## [1008,] "1926" "Santiago" "Chile"
## [1009,] "1926" "Amsterdam" "Netherlands"
# #algorithm i wrote to find all countries with first 3 letter Eng and replace the entire string with England
# cc<-as.vector(newnew$countries)
# indf<-c()
# for(i in 1:length(cc)){
# dumba<-str_split(cc[i],"")
# dumba<-unlist(dumba)
# if((dumba[1]=="E")&&(dumba[2]=="n")&&(dumba[3]=="g")){
# indf=append(indf,i)
# }
# }
#
# for(i in 1:length(indf)){
# cc[indf[i]]<-"England"
# }
# newnew$countries<-cc
#
#
#
# ca<-as.vector(newnew$away_team)
# inda<-c()
# for(i in 1:length(ca)){
# dumba<-str_split(ca[i],"")
# dumba<-unlist(dumba)
# if((dumba[1]=="E")&&(dumba[2]=="n")&&(dumba[3]=="g")){
# inda=append(inda,i)
# }
# }
#
# for(i in 1:length(inda)){
# ca[inda[i]]<-"England"
# }
#
# newnew$away_team<-ca
#
#
# ch<-as.vector(newnew$home_team)
# indh<-c()
# for(i in 1:length(ch)){
# dumba<-str_split(ch[i],"")
# dumba<-unlist(dumba)
# if((dumba[1]=="E")&&(dumba[2]=="n")&&(dumba[3]=="g")){
# indh=append(indh,i)
# }
# }
#
# for(i in 1:length(indh)){
# ch[indh[i]]<-"England"
# }
#
# newnew$away_team<-ch
##d
##function I wrote to be used later
difference=function(x,y){
z<-abs(x-y)
return(z)
}
newnew$neutral[is.na(newnew$neutral)]<-FALSE
Findex<-which(newnew$neutral==FALSE)
Tindex<-which(newnew$neutral==TRUE)
homee<-as.vector(newnew$home_score)
awayy<-as.vector(newnew$away_score)
Fcount=0
pl<-length(Findex)
for (i in 1:pl) {
ind=Findex[i]
Fcount=Fcount+difference(homee[ind],awayy[ind])
}
#Fcount is the average leading score for false
#yielded 2083
ll<-length(Tindex)
Tcount=0
for(i in 1:ll){
ind=Tindex[i]
Tcount<-Tcount+difference(homee[ind],awayy[ind])
}
#Tcount is the average leading score for true index
#yielded 114
##e
newnew$Ticket_Price
## [1] JPY3,412.0 JPY3,035.0 JPY2,032.9 JPY1,225.2 JPY2,357.7
## [6] JPY1,490.7 JPY3,565.7 JPY1,184.5 JPY3,711.6 JPY2,037.1
## [11] JPY2,340.9 JPY1,557.6 JPY2,765.6 JPY3,609.6 JPY3,533.3
## [16] JPY2,565.1 JPY2,206.1 JPY3,721.4 JPY1,415.3 JPY2,007.2
## [21] JPY3,351.9 JPY3,166.0 JPY1,178.2 JPY2,248.3 JPY2,128.8
## [26] JPY1,812.9 JPY1,962.6 JPY3,610.3 JPY1,841.6 JPY3,550.6
## [31] JPY1,008.2 JPY1,832.7 JPY1,780.2 JPY1,266.1 JPY3,512.5
## [36] JPY2,606.9 JPY1,894.8 JPY3,690.0 JPY1,750.2 JPY3,419.7
## [41] JPY1,707.4 JPY1,049.1 JPY1,534.4 JPY1,047.2 JPY2,562.5
## [46] JPY2,596.5 JPY3,025.4 JPY3,390.9 JPY3,593.7 JPY2,223.7
## [51] JPY1,164.2 JPY1,780.0 JPY2,830.4 JPY3,647.2 JPY2,229.5
## [56] JPY3,723.2 JPY2,714.4 JPY2,547.3 JPY1,423.1 JPY2,184.6
## [61] JPY2,450.8 JPY2,720.4 JPY1,348.1 JPY2,035.2 JPY3,086.8
## [66] JPY1,533.2 JPY1,481.6 JPY1,160.4 JPY2,470.9 JPY1,917.9
## [71] JPY1,046.7 JPY3,091.9 JPY2,758.8 JPY3,719.8 JPY3,424.9
## [76] JPY2,318.9 JPY3,179.0 JPY3,137.0 JPY3,391.2 JPY3,125.9
## [81] JPY1,245.1 JPY2,914.5 JPY2,211.8 JPY2,401.1 JPY2,322.2
## [86] JPY2,449.3 JPY3,140.1 JPY2,843.6 JPY2,213.5 JPY2,166.9
## [91] JPY2,174.5 JPY1,410.6 JPY3,669.4 JPY1,676.7 JPY3,414.6
## [96] JPY3,422.6 JPY1,110.6 JPY1,914.1 JPY1,980.7 JPY2,135.1
## [101] JPY1,449.5 JPY3,642.9 JPY3,795.9 JPY2,969.4 JPY1,869.5
## [106] JPY1,717.9 JPY3,448.7 JPY3,554.4 JPY2,507.4 JPY2,673.7
## [111] JPY2,521.3 JPY2,725.4 JPY2,931.4 JPY3,217.6 JPY2,241.2
## [116] JPY2,392.0 JPY3,233.2 JPY2,346.4 JPY2,994.2 JPY2,739.6
## [121] JPY1,128.7 JPY2,024.5 JPY1,809.8 JPY1,957.1 JPY1,841.0
## [126] JPY3,316.5 JPY1,857.9 JPY3,140.5 JPY3,398.6 JPY2,470.0
## [131] JPY3,608.2 JPY3,362.3 JPY1,499.3 JPY1,138.0 JPY2,976.5
## [136] JPY1,163.0 JPY1,338.9 JPY2,245.9 JPY1,808.4 JPY2,178.0
## [141] JPY2,728.5 JPY3,362.8 JPY2,190.2 JPY1,954.9 JPY1,694.7
## [146] JPY1,191.7 JPY1,292.0 JPY2,644.4 JPY2,057.3 JPY1,505.9
## [151] JPY2,458.6 JPY3,297.6 JPY2,996.5 JPY1,202.8 JPY1,533.6
## [156] JPY1,061.2 JPY3,019.7 JPY2,184.6 JPY1,342.2 JPY1,650.5
## [161] JPY1,819.0 JPY3,726.4 JPY2,886.6 JPY1,495.6 JPY1,684.0
## [166] JPY2,223.1 JPY1,609.9 JPY2,742.0 JPY2,347.1 JPY3,154.0
## [171] JPY2,439.6 JPY1,886.7 JPY3,310.0 JPY3,599.4 JPY2,141.6
## [176] JPY1,433.2 JPY1,124.5 JPY3,259.1 JPY1,716.7 JPY2,860.1
## [181] JPY1,739.7 JPY1,385.2 JPY1,491.6 JPY2,335.4 JPY2,753.5
## [186] JPY3,590.3 JPY3,782.7 JPY1,721.8 JPY3,202.1 JPY1,713.1
## [191] JPY2,227.7 JPY3,399.9 JPY2,939.7 JPY1,941.9 JPY3,591.3
## [196] JPY2,222.5 JPY2,060.0 JPY3,257.7 JPY3,091.1 JPY2,590.9
## [201] JPY2,996.2 JPY1,891.3 JPY2,263.3 JPY3,610.8 JPY2,463.1
## [206] JPY1,924.6 JPY3,079.8 JPY3,216.6 JPY2,370.7 JPY3,060.2
## [211] JPY2,027.9 JPY1,935.4 JPY1,773.5 JPY3,785.3 JPY2,720.5
## [216] JPY2,096.9 JPY2,338.6 JPY1,119.9 JPY1,994.1 JPY2,201.7
## [221] JPY2,596.2 JPY2,758.7 JPY1,615.2 JPY3,368.7 JPY1,591.2
## [226] JPY3,130.9 JPY3,562.6 JPY1,804.0 JPY1,529.3 JPY3,752.8
## [231] JPY2,747.0 JPY3,670.8 JPY1,466.0 JPY1,835.3 JPY2,144.7
## [236] JPY1,139.6 JPY2,825.2 JPY1,624.1 JPY1,437.8 JPY3,018.8
## [241] JPY3,027.5 JPY1,738.6 JPY2,642.6 JPY3,201.1 JPY2,052.1
## [246] JPY1,439.2 JPY2,671.5 JPY1,297.7 JPY2,483.8 JPY3,049.6
## [251] JPY1,561.5 JPY2,513.7 JPY1,227.3 JPY2,028.6 JPY2,518.3
## [256] JPY2,249.5 JPY1,441.0 JPY1,977.0 JPY2,360.7 JPY1,076.1
## [261] JPY1,139.0 JPY1,227.4 JPY1,494.0 JPY3,138.2 JPY2,700.3
## [266] JPY3,066.7 JPY3,385.8 JPY3,791.1 JPY2,588.2 JPY1,190.4
## [271] JPY1,448.0 JPY1,976.1 JPY1,949.0 JPY2,356.9 JPY3,416.3
## [276] JPY2,998.1 JPY2,954.4 JPY1,407.7 JPY3,196.3 JPY2,641.7
## [281] JPY3,353.6 JPY1,598.3 JPY2,811.9 JPY2,402.8 JPY3,425.9
## [286] JPY1,157.4 JPY1,462.6 JPY1,511.9 JPY2,729.8 JPY1,623.8
## [291] JPY2,027.9 JPY2,833.9 JPY2,623.8 JPY3,456.7 JPY3,541.0
## [296] JPY1,523.2 JPY2,939.9 JPY1,510.3 JPY1,740.5 JPY2,338.5
## [301] JPY2,016.7 JPY2,005.8 JPY1,478.0 JPY2,445.9 JPY2,299.8
## [306] JPY1,774.0 JPY1,864.3 JPY1,866.2 JPY3,200.0 JPY1,852.7
## [311] JPY1,871.1 JPY2,220.8 JPY3,131.5 JPY2,436.5 JPY3,140.5
## [316] JPY3,075.8 JPY1,928.6 JPY2,624.3 JPY3,584.8 JPY2,868.6
## [321] JPY2,430.1 JPY1,480.1 JPY1,719.4 JPY2,326.5 JPY2,483.0
## [326] JPY2,567.6 JPY1,450.4 JPY1,318.1 JPY3,079.0 JPY1,630.8
## [331] JPY1,518.9 JPY1,869.9 JPY3,525.6 JPY2,429.1 JPY1,053.2
## [336] JPY1,034.3 JPY1,372.3 JPY3,544.9 JPY2,029.1 JPY2,752.7
## [341] JPY1,676.9 JPY3,034.3 JPY3,550.8 JPY2,916.2 JPY2,332.5
## [346] JPY2,638.3 JPY2,788.2 JPY1,015.7 JPY3,129.0 JPY2,451.8
## [351] JPY2,570.1 JPY2,343.1 JPY3,328.9 JPY1,098.3 JPY2,875.8
## [356] JPY3,197.4 JPY3,121.0 JPY1,196.1 JPY1,192.1 JPY2,019.5
## [361] JPY1,364.0 JPY1,155.5 JPY1,036.3 JPY1,854.5 JPY2,120.1
## [366] JPY3,371.3 JPY3,586.9 JPY2,354.8 JPY1,459.0 JPY2,043.5
## [371] JPY2,746.2 JPY3,535.0 JPY2,877.1 JPY3,574.0 JPY2,663.9
## [376] JPY2,051.3 JPY2,086.7 JPY1,640.5 JPY1,751.0 JPY2,924.0
## [381] JPY1,734.0 JPY2,910.7 JPY2,419.5 JPY3,472.5 JPY3,528.8
## [386] JPY1,379.6 JPY1,598.4 JPY2,386.6 JPY2,263.5 JPY2,898.9
## [391] JPY2,510.7 JPY1,571.2 JPY3,199.8 JPY1,271.3 JPY2,143.9
## [396] JPY1,081.4 JPY3,066.9 JPY2,348.1 JPY1,188.2 JPY2,355.7
## [401] JPY3,138.5 JPY1,914.0 JPY2,507.5 JPY2,315.0 JPY1,382.5
## [406] JPY1,174.0 JPY1,027.7 JPY3,197.8 JPY2,000.8 JPY2,586.0
## [411] JPY3,095.0 JPY1,764.2 JPY2,750.5 JPY1,948.2 JPY2,002.0
## [416] JPY3,202.8 JPY2,455.9 JPY1,991.5 JPY2,573.5 JPY3,751.5
## [421] JPY1,632.5 JPY3,368.6 JPY2,460.9 JPY1,639.7 JPY2,525.1
## [426] JPY1,396.0 JPY1,657.7 JPY3,074.3 JPY2,620.0 JPY2,397.5
## [431] JPY2,741.4 JPY3,098.2 JPY2,961.9 JPY1,462.4 JPY3,132.1
## [436] JPY2,503.5 JPY2,845.8 JPY2,328.0 JPY2,731.7 JPY3,341.5
## [441] JPY2,293.6 JPY2,678.6 JPY2,885.0 JPY2,022.8 JPY1,286.1
## [446] JPY2,059.1 JPY3,081.9 JPY2,613.1 JPY1,829.8 JPY1,743.9
## [451] JPY3,772.9 JPY2,659.1 JPY1,771.3 JPY1,226.6 JPY1,005.4
## [456] JPY1,945.0 JPY3,562.0 JPY3,302.2 JPY1,769.1 JPY2,324.9
## [461] JPY3,025.5 JPY3,484.2 JPY2,650.0 JPY2,418.7 JPY3,417.9
## [466] JPY3,347.1 JPY1,512.9 JPY2,752.7 JPY1,328.1 JPY1,802.3
## [471] JPY3,398.4 JPY3,255.9 JPY1,472.9 JPY3,300.0 JPY1,175.1
## [476] JPY1,461.9 JPY3,188.8 JPY2,669.6 JPY2,327.2 JPY3,610.0
## [481] JPY3,768.2 JPY2,585.5 JPY2,776.4 JPY3,109.5 JPY2,013.6
## [486] JPY3,553.8 JPY1,742.7 JPY2,621.4 JPY3,671.2 JPY1,123.2
## [491] JPY1,314.1 JPY2,189.7 JPY3,047.9 JPY3,226.1 JPY2,996.0
## [496] JPY1,435.7 JPY1,793.5 JPY2,048.7 JPY3,625.6 JPY1,919.1
## [501] JPY1,636.5 JPY1,027.2 JPY2,378.2 JPY3,212.7 JPY2,822.4
## [506] JPY1,452.0 JPY3,771.8 JPY1,248.4 JPY3,046.2 JPY1,661.7
## [511] JPY3,683.4 JPY1,832.6 JPY1,652.8 JPY2,714.8 JPY1,113.2
## [516] JPY1,165.0 JPY3,276.7 JPY1,368.4 JPY1,144.8 JPY1,819.4
## [521] JPY1,251.3 JPY2,443.5 JPY3,042.1 JPY3,389.7 JPY2,337.7
## [526] JPY1,836.7 JPY3,244.3 JPY2,741.9 JPY3,587.5 JPY3,440.3
## [531] JPY3,294.1 JPY1,008.0 JPY2,816.9 JPY2,147.3 JPY2,986.7
## [536] JPY3,214.1 JPY2,561.2 JPY2,194.1 JPY3,677.5 JPY3,165.1
## [541] JPY2,458.5 JPY2,190.8 JPY3,212.6 JPY3,251.1 JPY1,486.0
## [546] JPY2,579.9 JPY2,443.8 JPY2,009.1 JPY1,064.0 JPY2,506.1
## [551] JPY2,554.5 JPY1,917.3 JPY1,191.3 JPY3,571.7 JPY2,252.0
## [556] JPY3,498.5 JPY2,134.3 JPY2,914.5 JPY3,336.6 JPY1,987.8
## [561] JPY1,729.0 JPY1,805.7 JPY1,709.2 JPY1,532.2 JPY1,067.8
## [566] JPY1,751.3 JPY3,051.0 JPY2,124.5 JPY3,413.2 JPY2,811.2
## [571] JPY2,149.6 JPY3,748.0 JPY3,605.7 JPY3,172.5 JPY1,954.8
## [576] JPY1,722.5 JPY1,442.6 JPY3,438.7 JPY2,653.8 JPY1,239.4
## [581] JPY3,110.5 JPY1,436.2 JPY1,189.4 JPY1,337.0 JPY1,142.6
## [586] JPY2,375.2 JPY2,451.8 JPY1,093.2 JPY2,916.7 JPY3,584.6
## [591] JPY1,026.6 JPY3,149.7 JPY1,123.1 JPY3,416.9 JPY2,738.5
## [596] JPY2,359.4 JPY3,276.2 JPY3,392.1 JPY1,984.5 JPY2,762.3
## [601] JPY3,478.1 JPY3,366.8 JPY1,755.1 JPY1,687.2 JPY2,214.6
## [606] JPY1,735.7 JPY3,552.1 JPY2,932.3 JPY2,309.0 JPY1,383.5
## [611] JPY2,428.9 JPY3,724.4 JPY1,515.4 JPY2,660.2 JPY2,474.8
## [616] JPY3,114.4 JPY1,727.1 JPY2,729.2 JPY1,100.7 JPY3,685.5
## [621] JPY1,464.5 JPY1,864.9 JPY2,135.9 JPY2,259.0 JPY2,582.0
## [626] JPY2,550.0 JPY3,400.3 JPY2,194.7 JPY2,443.0 JPY2,483.8
## [631] JPY2,258.1 JPY1,914.2 JPY3,423.9 JPY3,268.3 JPY3,778.0
## [636] JPY2,212.1 JPY2,304.7 JPY2,342.5 JPY3,465.7 JPY2,442.9
## [641] JPY2,922.4 JPY1,495.3 JPY2,315.1 JPY2,921.6 JPY1,076.6
## [646] JPY1,987.7 JPY1,466.5 JPY2,642.5 JPY1,808.8 JPY2,505.1
## [651] JPY1,373.6 JPY2,799.8 JPY1,343.7 JPY2,849.7 JPY1,951.5
## [656] JPY2,728.2 JPY3,322.4 JPY3,237.8 JPY1,500.4 JPY1,742.7
## [661] JPY2,531.7 JPY1,939.3 JPY2,174.8 JPY2,849.8 JPY3,201.2
## [666] JPY1,489.3 JPY2,442.9 JPY3,462.7 JPY2,213.0 JPY2,167.8
## [671] JPY1,782.7 JPY2,311.3 JPY3,278.6 JPY1,525.9 JPY3,443.6
## [676] JPY3,388.7 JPY2,421.7 JPY2,826.0 JPY3,798.6 JPY2,793.7
## [681] JPY2,396.7 JPY1,881.7 JPY3,795.2 JPY1,649.9 JPY2,250.9
## [686] JPY1,741.8 JPY1,162.7 JPY3,676.4 JPY1,215.9 JPY2,305.0
## [691] JPY1,536.9 JPY3,747.3 JPY3,605.0 JPY2,454.1 JPY3,676.1
## [696] JPY2,978.1 JPY2,832.7 JPY1,620.2 JPY2,739.2 JPY3,457.3
## [701] JPY1,827.8 JPY1,999.1 JPY1,698.0 JPY2,946.0 JPY1,661.9
## [706] JPY1,274.8 JPY1,537.6 JPY3,067.7 JPY1,824.9 JPY2,871.0
## [711] JPY1,746.9 JPY1,031.7 JPY2,964.0 JPY1,583.7 JPY3,182.9
## [716] JPY1,426.6 JPY3,647.6 JPY3,287.8 JPY1,020.0 JPY2,997.4
## [721] JPY2,931.3 JPY1,586.1 JPY2,050.2 JPY2,164.8 JPY2,105.9
## [726] JPY3,191.1 JPY1,140.9 JPY1,152.1 JPY2,363.3 JPY2,433.4
## [731] JPY1,612.8 JPY2,710.6 JPY2,789.2 JPY2,863.3 JPY1,372.1
## [736] JPY1,399.2 JPY3,799.3 JPY1,712.0 JPY1,607.8 JPY2,878.9
## [741] JPY2,088.9 JPY2,598.7 JPY1,306.8 JPY3,227.8 JPY2,043.1
## [746] JPY3,337.4 JPY3,754.1 JPY2,560.4 JPY1,978.4 JPY3,697.8
## [751] JPY3,041.6 JPY2,570.8 JPY1,486.2 JPY2,797.1 JPY3,626.5
## [756] JPY2,867.2 JPY2,904.7 JPY1,356.0 JPY1,663.0 JPY2,556.4
## [761] JPY2,655.2 JPY2,048.0 JPY1,978.4 JPY2,621.4 JPY2,944.7
## [766] JPY2,382.2 JPY1,585.6 JPY1,956.9 JPY2,899.5 JPY1,338.1
## [771] JPY3,641.3 JPY1,465.3 JPY3,510.7 JPY1,047.3 JPY2,735.5
## [776] JPY2,706.6 JPY2,765.9 JPY2,226.2 JPY2,857.3 JPY3,070.1
## [781] JPY3,283.5 JPY2,706.9 JPY2,820.6 JPY1,710.3 JPY3,037.8
## [786] JPY1,783.9 JPY3,067.0 JPY1,270.8 JPY2,652.3 JPY1,615.2
## [791] JPY3,140.3 JPY3,779.8 JPY2,464.6 JPY3,098.0 JPY3,363.4
## [796] JPY1,302.3 JPY1,935.8 JPY1,037.7 JPY2,615.1 JPY1,757.1
## [801] JPY2,436.3 JPY2,922.9 JPY1,395.8 JPY2,714.0 JPY3,477.2
## [806] JPY1,747.5 JPY1,343.0 JPY1,692.7 JPY3,531.5 JPY2,709.2
## [811] JPY1,399.4 JPY2,979.1 JPY1,456.4 JPY3,795.0 JPY3,255.0
## [816] JPY2,178.9 JPY2,308.8 JPY2,091.8 JPY1,091.0 JPY2,849.0
## [821] JPY3,614.2 JPY1,722.6 JPY1,017.9 JPY3,302.0 JPY1,684.0
## [826] JPY1,275.4 JPY1,179.8 JPY2,555.8 JPY1,798.1 JPY1,073.8
## [831] JPY2,498.9 JPY3,000.8 JPY2,034.2 JPY2,151.8 JPY1,787.7
## [836] JPY3,626.2 JPY2,217.8 JPY1,399.5 JPY2,697.1 JPY1,317.6
## [841] JPY1,549.0 JPY3,542.8 JPY1,053.2 JPY2,534.2 JPY1,496.3
## [846] JPY1,110.4 JPY1,079.6 JPY3,125.6 JPY3,064.7 JPY1,570.1
## [851] JPY3,714.0 JPY2,837.8 JPY1,352.8 JPY3,388.1 JPY1,526.3
## [856] JPY2,369.5 JPY1,533.8 JPY3,032.2 JPY3,197.4 JPY3,649.1
## [861] JPY2,435.0 JPY1,785.9 JPY2,925.2 JPY1,527.7 JPY3,183.4
## [866] JPY3,046.9 JPY2,674.0 JPY2,602.0 JPY2,884.0 JPY2,642.1
## [871] JPY1,343.0 JPY2,865.7 JPY2,331.0 JPY2,636.0 JPY1,752.9
## [876] JPY2,965.9 JPY1,268.7 JPY1,307.8 JPY1,339.3 JPY2,871.5
## [881] JPY3,312.2 JPY3,732.1 JPY1,270.7 JPY2,390.6 JPY1,960.3
## [886] JPY1,946.7 JPY3,343.9 JPY2,968.9 JPY2,761.3 JPY3,522.4
## [891] JPY3,080.2 JPY2,352.4 JPY2,763.5 JPY2,966.8 JPY2,234.3
## [896] JPY1,908.3 JPY1,038.9 JPY1,716.6 JPY1,759.7 JPY1,890.1
## [901] JPY1,235.3 JPY3,544.0 JPY1,987.5 JPY3,628.8 JPY3,744.1
## [906] JPY1,360.8 JPY2,553.9 JPY2,606.7 JPY1,660.8 JPY2,878.8
## [911] JPY3,276.2 JPY1,219.0 JPY2,927.6 JPY2,678.0 JPY2,310.3
## [916] JPY1,942.9 JPY2,147.9 JPY1,100.4 JPY2,238.1 JPY3,143.0
## [921] JPY2,320.3 JPY1,838.1 JPY3,050.2 JPY1,186.7 JPY2,542.2
## [926] JPY3,753.3 JPY1,742.6 JPY3,209.1 JPY3,234.3 JPY3,461.6
## [931] JPY1,678.9 JPY2,566.7 JPY3,533.4 JPY1,022.9 JPY1,457.8
## [936] JPY1,727.5 JPY3,163.8 JPY1,199.0 JPY3,508.2 JPY1,881.9
## [941] JPY3,489.7 JPY2,704.5 JPY2,275.0 JPY2,964.4 JPY3,115.7
## [946] JPY2,477.9 JPY1,045.5 JPY1,214.8 JPY2,880.4 JPY3,012.6
## [951] JPY2,278.2 JPY1,625.6 JPY3,032.0 JPY1,049.1 JPY2,521.3
## [956] JPY1,227.7 JPY3,526.5 JPY3,199.5 JPY2,210.3 JPY2,719.4
## [961] JPY3,151.7 JPY1,602.2 JPY2,281.9 JPY1,000.2 JPY3,083.3
## [966] JPY3,032.7 JPY1,305.5 JPY3,001.6 JPY3,038.2 JPY2,195.5
## [971] JPY1,975.6 JPY1,630.8 JPY2,829.8 JPY1,216.1 JPY1,533.9
## [976] JPY1,791.3 JPY2,976.7 JPY1,992.6 JPY3,796.2 JPY1,489.8
## [981] JPY3,627.2 JPY1,406.1 JPY3,342.4 JPY3,399.7 JPY1,750.2
## [986] JPY1,837.8 JPY2,756.6 JPY2,777.1 JPY2,223.9 JPY2,686.5
## [991] JPY1,065.9 JPY2,875.2 JPY2,134.3 JPY1,872.2 JPY2,052.2
## [996] JPY3,007.0 JPY2,300.0 JPY2,559.9 JPY1,832.6 JPY3,479.9
## [1001] JPY3,079.7 JPY2,559.2 JPY3,723.0 JPY1,672.6 JPY3,453.1
## [1006] JPY3,654.7 JPY3,087.2 JPY2,097.0 JPY2,461.5
## 986 Levels: JPY1,000.2 JPY1,005.4 JPY1,008.0 JPY1,008.2 ... JPY3,799.3
tickets<-as.vector(newnew$Ticket_Price)
kl=length(tickets)
prices<-c()
for(i in 1:kl){
dumbo=unlist(strsplit(tickets[i],"Y"))
prices<-append(prices,dumbo[2])
}
prices<-str_replace_all(prices,",","")
options(digits=6)
prices<-as.double(prices)
prices<-prices/134.5
newnew$Ticket_Price<-prices
##5
?dump
?save
##dump makes a textual representation of the R object, can source into a new R session
##save writes an external representation of the R objects, can be loaded into a new R session
mix<-c(1,2,3,4)
trix<-c(2,3,4,5)
dump(c("enabd","erha"),file = "randomFileee")
?source
#source(file = "randomFile",local = TRUE)
?load
save(mix,file = "randomFile")
load(file = "randomFile",verbose = TRUE)
## Loading objects:
## mix