Income distribution and Tour de France

A few days ago, Jean-François Mignot published an interesting article entitled Tour de France 2014 : pourquoi le vainqueur gagne 100 fois plus que le 10e. In this article, we have the following graph, with the income of the cyclist, as a function of his final ranking (the data where downloaded from http://sportbuzzbusiness.fr/)

> bike=read.csv(
+ "http://freakonometrics.free.fr/tourdefrance.csv",
+ sep=";",header=TRUE,dec=" ")

> bike[1:19,"prime"]=bike[1:19,"prime"]*1000
> plot(bike,log="y",type="b",
+ xlab="(Final) rank",ylab="Bonus")

As pointed out by Jean-François, if the winner gets a lot of money, the bonus decreases fast, very fast actually. Gini index is very high here

> library(ineq)
> ineq(X,type="Gini")
[1] 0.910461

and if we look at Lorenz curve, indeed, the Tour de France is not very equalitarian,

> plot(Lc(X),col="red",lwd=2)

If we look at the Pareto plot (with the rank versus the bonus, both in log scales),

> X=bike$prime
> n=length(X)
> plot(X,((1:n)/(n+1)),type="b",log="xy",
+ ylab="(Final) rank (log scale)",
+ xlab="Bonus (log scale)")

We have a distribution with heavy tails, and thus, not equalitarian.

If we try to fit a lognormal distribution

> library(fitdistrplus)
> fitdistr(X,"lnorm")
> plot(X,((1:n)/(n+1)),type="b",log="xy",
+ ylab="(Final) rank (log scale)",
+ xlab="Bonus (log scale)")
> lines(qlnorm(1-(1:m)/(m+1),
+ parlnorm[1],parlnorm[2]),(1:m)/(m+1),
+ col="blue")

the fit is not good. Here we clearly underestimate the bonus for the winer (and for the top ten cyclist). We got the same with a paralogistic distribution,

> library(VGAM)
> parparalog=Coef(vglm(X ~ 1,paralogistic))
> plot(X,((1:n)/(n+1)),type="b",log="xy",
+ ylab="(Final) rank (log scale)",
+ xlab="Bonus (log scale)")
> lines(qparalogistic(1-(1:m)/(m+1),
+ parparalog[1],parparalog[2]),(1:m)/(m+1),
+ col="blue")

We can play hours trying to find the best distribution for the bonuses. Let’s try a last one : the (generalized) Pareto distribution. This distribution was introduced to model incomes, and it has very nice properties to model extremal events (very large bonuses). Its power tails are related to power decay of the size of the bonus we do observe here.

> library(evir)
> pargpd=evir::gpd(X,min(X))$par.ests
> plot(X,((1:n)/(n+1)),type="b",log="xy",
+ ylab="(Final) rank (log scale)",
+ xlab="Bonus (log scale)")
> m=1000
> lines(evir::qgpd(1-(1:m)/(m+1),xi=pargpd[1],
+ mu=min(X),beta=pargpd[2]),(1:m)/(m+1),col="blue")

The fit is not perfect. And if we focus only on bonuses above 700 (and not 450), the fit is slightly better

> library(evir)
> pargpd2=evir::gpd(X,700)$par.ests
> plot(X,((1:n)/(n+1)),type="b",log="xy",
+ ylab="(Final) rank (log scale)",xlab="Bonus (log scale)")
> m=1000
> lines(evir::qgpd(1-(1:m)/(m+1),xi=pargpd2[1],
+ mu=700,beta=pargpd2[2]),(1:m)/(m+1)*mean(X>700),col="blue")

Clearly, fitting a parametric distribution to model the income is not that simple. I’ll get back to this point soon. With Emmanuel Flachaire, we are finalizing a paper on nonparametric estimation of income distribution, to improve the estimation of inequality indices. Because the value of Gini index, for instance, is not very robust here, with 150 observations from a Pareto distribution. If we generate 1,000 samples from the Pareto distribution that was fitted, our index is very volatile,

> M=matrix(evir::rgpd(150*1000,xi=pargpd[1],
+ mu=min(X),beta=pargpd[2]),150,1000)
> gini=function(x) ineq(x,type="Gini")
> boxplot(apply(M,2,gini),horizontal=TRUE)
> abline(v=ineq(X,type="Gini"),col="red")

But sometimes, we have no choice, and using a parametric distribution is the only option. I will upload a post on that topic, based on a study we did with Dr Goulu.


OpenEdition suggests that you cite this post as follows:
Arthur Charpentier (July 21, 2014). Income distribution and Tour de France. Freakonometrics. Retrieved December 3, 2024 from https://doi.org/10.58079/ouw9


4 thoughts on “Income distribution and Tour de France”

  1. There is one important point at the end of Jean-François Mignot’s article – the riders on a team share out their prize money, so the domestiques on a team (who might finish far down on GC and rarely place on a stage) will still get a good amount of prize money if their team leader does well in the race. This means individual prize winnings isn’t really a good measure of income and it isn’t a signal that the riders are reacting to. It would be interesting to sum prize money up by team and see how that looked.

  2. Interesting post!!
    I’d like to check data of all cyclists who start the tour and then I’d like to check who drops out each race and when (in minutes…). Can you help me to find open data (statistics) to perform the statistical modeling with real data (Tour France 2013 or 2014)?

    My main objective is to apply a statistical modeling which needs data with factors influenced in performance in the Tour de France for example.

    Martí

  3. Income (prize money) of the best 100 tennismen over one year is published here http://legacy.tennis.com/rankings/money_men.aspx/ . I calculated a corresponding Gini index of 0.56 ( http://www.drgoulu.com/2013/10/26/112-le-prix-du-talent )

    Surprising to see a “team sport” like cyclism being more inequal than an “individual sport” like tennis.

    However I guess a cyclist doesn’t always rank the same at each stage (étape?), so the distribution of the total incomes at the end of the Tour should be a bit smoother, and even smoother at the end of one year.

Leave a Reply

Your email address will not be published. Required fields are marked *

This site uses Akismet to reduce spam. Learn how your comment data is processed.