moez il y a 1 an
commit
b26c0afaec

+ 25 - 0
README.md

@@ -0,0 +1,25 @@
+# Bordeaux model
+## Transport flows and housing market
+
+This is a computation tool given as an acoompagniment to the paper
+**A model for the evaluation of urban transport policies and their 
+interaction with the housing market**
+
+### To use this tool
+
+1. download the package brd.f
+
+        git clone https://gogs.univ-littoral.fr/mkilani/bordeaux-model
+
+2. compile the fortran code
+
+        gfortran -o brd brd.f
+
+   which produces an executable called "brd"
+
+3. run a simulation 
+
+        ./brd empiric/s1.dat
+
+
+        

+ 523 - 0
brd.f

@@ -0,0 +1,523 @@
+      PROGRAM BORDEAUX
+C----------------------------------------------------------- 
+
+      IMPLICIT NONE
+      REAL*8 AA(21), P(21), T(21), T0(21), Q(21), S(21), Y(21), VAR(21)
+      REAL*8 COU(21),DIS(21),VIT(21)
+      REAL*8 CES2, PCES2,ALPHA,A,BPR
+      REAL*8 VAL,VOL,DELTAVOL,DELTAP,CAP(8)
+      REAL*8 POL(8),CONG(8), OCC(8),TOTPOL,TOTCONG,TOTPOL0,TOTCONG0
+      REAL*8 BPRK(8),BPRA(8),BPRB(8),BPRT0(8),BPRT(8),BPRCOEF(8)
+      REAL*8 ZERO,ONE,TWO, EPS
+      REAL*8 VOLTC0,VOLTC1,VARTC,VOLVP0,VOLVP1,VARVP
+      INTEGER CALIB,I, IARGC, ITER, ITERMAX
+      CHARACTER(LEN=20) LINE
+      CHARACTER(LEN=50) FICHIER
+      CHARACTER(LEN=36) SCENARIO
+      CHARACTER(LEN=12)  MODES (8)
+
+      ZERO=0.0D0
+      ONE=1.D0 
+      TWO=2.D0
+      CALIB=1 
+      ITERMAX=50
+      EPS=0.1D-9
+
+      P = ZERO
+      T = ZERO
+
+C =============== LES DONNEES
+
+      A=ONE
+      DATA  MODES/ 'VP(CBD->CBD)', 'TC(CBD->CBD)',
+     1             'VP(CBD->SUB)', 'TC(CBD->SUB)',
+     1             'VP(SUB->CBD)', 'TC(SUB->CBD)',
+     1             'VP(SUB->SUB)', 'TC(SUB->SUB)'/
+
+C LES DONNEES SONT DANS UN FICHIER TEXTE EXTERNE
+      IF(IARGC().NE.1) THEN 
+         PRINT*, 'Un fichier de données doit être fournie'
+         STOP
+      ENDIF
+
+      CALL GETARG(1, FICHIER)
+C     PRINT*, FICHIER
+      OPEN(UNIT=1,FILE=FICHIER)
+      PRINT*, "Reading file: ", FICHIER
+ 6    READ(1,*,END=7) LINE
+      IF(LINE(1:4).EQ.':vol') THEN
+        READ(1,*) T(1:8)
+      ELSEIF(LINE(1:4).EQ.':hou') THEN
+        READ(1,*) T(13), T(15)
+      ELSEIF(LINE(1:4).EQ.':ren') THEN
+        READ(1,*) P(13), P(15)
+      ELSEIF(LINE(1:4).EQ.':alp') THEN
+        READ(1,*) ALPHA
+      ELSEIF(LINE(1:4).EQ.':cou') THEN
+        READ(1,*) COU(1:8)
+      ELSEIF(LINE(1:4).EQ.':dis') THEN
+        READ(1,*) DIS(1:8)
+      ELSEIF(LINE(1:4).EQ.':vit') THEN
+        READ(1,*) VIT(1:8)
+      ELSEIF(LINE(1:4).EQ.':pri') THEN
+        READ(1,*) P(20)
+      ELSEIF(LINE(1:4).EQ.':val') THEN
+        READ(1,*) VAL
+      ELSEIF(LINE(1:4).EQ.':ela') THEN
+        READ(1,*) S(09:12),S(14),S(16),S(17:19),S(21)
+      ELSEIF(LINE(1:4).EQ.':pol') THEN
+        READ(1,*) POL
+      ELSEIF(LINE(1:4).EQ.':con') THEN
+        READ(1,*) CONG
+      ELSEIF(LINE(1:4).EQ.':occ') THEN
+        READ(1,*) OCC
+      ELSEIF(LINE(1:4).EQ.':abp') THEN
+        READ(1,*) BPRA
+      ELSEIF(LINE(1:4).EQ.':bbp') THEN
+        READ(1,*) BPRB
+      ELSEIF(LINE(1:4).EQ.':tbp') THEN
+        READ(1,*) BPRCOEF
+      ELSEIF(LINE(1:4).EQ.':sce') THEN
+        READ(1,*) SCENARIO
+      ENDIF
+      GOTO 6 
+ 7    CLOSE(1)              
+
+C LE VOLUME DE TRANSPORT AVEC LES FLUX INITIAUX
+      VOL=ZERO
+      DO 230, I=1,8
+        VOL=VOL+T(I)/OCC(I)*CONG(I)
+230   CONTINUE
+C     PRINT*, VOL 
+
+C CALIBRER LA VALEUR DE K POUR CHAQUE MODE
+C
+C The BPR function is
+C 
+C    T = T_0 ( 1 + a (V/K)^b )
+C
+C So:
+C
+C    K = V ( ( T/T_0 - 1 ) * (1/a) ) ^ (-1/b)
+C
+      DO 22, I=1,8
+        BPRT(I)=DIS(I)/VIT(I)
+        BPRT0(I)=BPRT(I)/BPRCOEF(I)
+        BPRK(I)=VOL*((ONE/BPRA(I)*(BPRT(I)/BPRT0(I)-ONE)))
+     2           **(-ONE/BPRB(I))
+C       PRINT '(I5,7F7.2)',I,BPRA(I),BPRB(I),BPRT0(I),BPRT(I),
+C    2      BPRCOEF(I), BPRK(I)
+22    CONTINUE
+C        DO 28, I=1,9
+C           P(I)=COU(I)*DIS(I)+
+C     2          BPR(VOL,BPRT0(I),BPRA(I),BPRB(I),BPRK(I))*VAL
+C           PRINT '(I5,F7.3)', I, P(I)
+C28      CONTINUE
+
+C CALCUL DES COUTS GENERALISES
+      DO 19, I=1,8
+        P(I)=COU(I)*DIS(I)+DIS(I)/VIT(I)*VAL
+C     PRINT '(I5,6F9.3)', I,VIT(I),DIS(I),COU(I),VAL,P(I),
+C    +                    COU(I)*DIS(I)/P(I)
+ 19   CONTINUE
+
+
+      ITER=0
+C ============= LA CALIBRATION DES PARAMETRES (SI CALIB = 1)
+C ============= CALCUL DES PRIX, DES VOLUMES
+
+100   CONTINUE 
+
+C DEBUT DE LA BOUCLE PRINCIPALE. CETTE BOUCLE CONTIENT QUATRE NIVEAUX
+C (CORRESPONDANT A L ARBORESCENCE DU MODELE). ELLE EST PASSEE DEUX FOIS,
+C LA PREMIERE POUR LA CALIBRATION (CALIB=1), ET LA DEUXIEME POUR LA
+C SIMULATION (CALIB=0) DES CHANGEMENTS DANS LES PARAMETRES PRIX OU
+C ELASTICITES
+
+C == NIVEAU 1
+
+      IF (CALIB.EQ.1) THEN 
+
+         CALL CAL2(P(01),P(02),T(01),T(02),S(09),AA(01),AA(02))
+         CALL CAL2(P(03),P(04),T(03),T(04),S(10),AA(03),AA(04))
+         CALL CAL2(P(05),P(06),T(05),T(06),S(11),AA(05),AA(06))
+         CALL CAL2(P(07),P(08),T(07),T(08),S(12),AA(07),AA(08))
+
+         Y(09)=P(1)*T(1)+P(2)*T(2)
+         Y(10)=P(3)*T(3)+P(4)*T(4)
+         Y(11)=P(5)*T(5)+P(6)*T(6)
+         Y(12)=P(7)*T(7)+P(8)*T(8) 
+
+      ENDIF
+
+      P(09)=PCES2(P(01),P(02),A,AA(01),AA(02),S(09))
+      P(10)=PCES2(P(03),P(04),A,AA(03),AA(04),S(10))
+      P(11)=PCES2(P(05),P(06),A,AA(05),AA(06),S(11))
+      P(12)=PCES2(P(07),P(08),A,AA(07),AA(08),S(12))
+      T(09)= CES2(T(01),T(02),A,AA(01),AA(02),S(09))
+      T(10)= CES2(T(03),T(04),A,AA(03),AA(04),S(10))
+      T(11)= CES2(T(05),T(06),A,AA(05),AA(06),S(11))
+      T(12)= CES2(T(07),T(08),A,AA(07),AA(08),S(12)) 
+
+C == NIVEAU 2
+
+      IF (CALIB.EQ.1) THEN
+
+         CALL CAL2(P(09),P(10),T(09),T(10),S(14),AA(09),AA(10))
+         CALL CAL2(P(11),P(12),T(11),T(12),S(16),AA(11),AA(12))
+
+         Y(14)=Y(09)+Y(10)
+         Y(16)=Y(11)+Y(12) 
+
+      ENDIF
+
+      P(14)=PCES2(P(09),P(10),A,AA(09),AA(10),S(14))
+      P(16)=PCES2(P(11),P(12),A,AA(11),AA(12),S(16))
+      T(14)= CES2(T(09),T(10),A,AA(09),AA(10),S(14))
+      T(16)= CES2(T(11),T(12),A,AA(11),AA(12),S(16))
+
+C == NIVEAU 3
+
+      IF (CALIB.EQ.1) THEN
+
+         CALL CAL2(P(13),P(14),T(13),T(14),S(17),AA(13),AA(14))
+         CALL CAL2(P(15),P(16),T(15),T(16),S(18),AA(15),AA(16))
+         
+         Y(17)=P(13)*T(13)+Y(14)
+         Y(18)=P(15)*T(15)+Y(16) 
+
+      ENDIF
+
+      P(17)=PCES2(P(13),P(14),A,AA(13),AA(14),S(17))
+      P(18)=PCES2(P(15),P(16),A,AA(15),AA(16),S(18))
+      T(17)= CES2(T(13),T(14),A,AA(13),AA(14),S(17))
+      T(18)= CES2(T(15),T(16),A,AA(15),AA(16),S(18))
+
+C == NIVEAU 4
+
+      IF (CALIB.EQ.1) THEN
+
+         CALL CAL2(P(17),P(18),T(17),T(18),S(19),AA(17),AA(18))
+         
+         Y(19)=Y(17)+Y(18)
+         T(20)=(ONE-ALPHA)/ALPHA*Y(19)
+
+      ENDIF
+
+      P(19)=PCES2(P(17),P(18),A,AA(17),AA(18),S(19))
+      T(19)= CES2(T(17),T(18),A,AA(17),AA(18),S(19)) 
+
+C == NIVEAU 5
+
+
+      IF (CALIB.EQ.1) THEN
+
+         CALL CAL2(P(19),P(20),T(19),T(20),S(21),AA(19),AA(20))
+         
+         Y(21)=Y(19)+P(20)*T(20)
+
+C        SAVEGARDER LES FLUX DE TRANSPORT INITIAUX DANS UN TABLEAU
+         DO I=1, 8
+           T0(I)=T(I)
+         ENDDO
+         T0(13)=T(13)
+         T0(15)=T(15)
+         T0(20)=T(20) 
+         T0(21)=CES2(T(19),T(20),A,AA(19),AA(20),S(21)) 
+
+      ENDIF
+
+      P(21)=PCES2(P(19),P(20),A,AA(19),AA(20),S(21))
+      T(21)= CES2(T(19),T(20),A,AA(19),AA(20),S(21))
+
+C  -----------------------------------------------------------
+C  ============ VERIFICATION DU CALCUL ET VOLUMES DE TRANSPORT
+C  -----------------------------------------------------------
+
+C CALCUL DES UTILITES (INDICES QUANTITES) A TOUS LES NIVEAUX
+      CALL QUANTITIES(AA,P,S,Y,A,POL,CONG,OCC,Q,TOTPOL,TOTCONG) 
+
+      IF(CALIB.EQ.1) THEN
+        CALIB=0 
+C  ON REPREND LE FICHIER DES DONNEES POUR LIRE LES CHANGEMENTS DE PRIX
+C  OU D ELASTICITE ET ON EXECUTE UNE DEUXIEME FOIS LA BOUCLE
+        OPEN(UNIT=1,FILE=FICHIER)
+ 16     READ(1,*,END=17) LINE
+        IF(LINE(1:4).EQ.':2di') THEN
+          READ(1,*) DIS(1:8)
+        ELSEIF(LINE(1:4).EQ.':2el') THEN
+          READ(1,*) S(09:12),S(14),S(16),S(17:19),S(21)
+        ELSEIF(LINE(1:4).EQ.':2vi') THEN
+          READ(1,*) VIT(1:8)
+        ELSEIF(LINE(1:4).EQ.':2re') THEN
+          READ(1,*) P(13), P(15)
+        ELSEIF(LINE(1:4).EQ.':2pr') THEN
+          READ(1,*) P(20)
+        ELSEIF(LINE(1:4).EQ.':2co') THEN
+          READ(1,*) COU(1:8)
+        ELSEIF(LINE(1:4).EQ.':2va') THEN
+          READ(1,*) VAL
+        ELSEIF(LINE(1:4).EQ.':2oc') THEN
+          READ(1,*) OCC(1:8)
+        ENDIF
+        GOTO 16 
+ 17     CLOSE(1)              
+
+        DO 18, I=1,8
+           P(I)=COU(I)*DIS(I)+DIS(I)/VIT(I)*VAL
+18      CONTINUE
+
+        TOTCONG0=TOTCONG
+        TOTPOL0=TOTPOL
+        GOTO 100 
+      ENDIF 
+
+      DO 14, I=1,8
+      VAR(I) =(Q( I)-T0( I))/T0( I)*100.D0
+14    CONTINUE
+      VAR(13)=(Q(13)-T0(13))/T0(13)*100.D0
+      VAR(15)=(Q(15)-T0(15))/T0(15)*100.D0
+      VAR(20)=(Q(20)-T0(20))/T0(20)*100.D0
+      VAR(21)=(Q(21)-T0(21))/T0(21)*100.D0
+C FIN DE LA BOUCLE PRINCIPALE 
+
+C VOLUME TOTAL DE TRANSPORT AVEC LES NOUVEAUX FLUX
+      VOL=ZERO
+      DO 23, I=1,8
+        VOL=VOL+Q(I)/OCC(I)*CONG(I)
+23    CONTINUE 
+
+      DO 28, I=1,8
+         P(I)=COU(I)*DIS(I)+
+     2        BPR(VOL,BPRT0(I),BPRA(I),BPRB(I),BPRK(I))*VAL
+C        PRINT '(I5,3F9.3)', I, BPRT0(I), BPRK(I), P(I)
+28    CONTINUE 
+
+      VOLVP0=T0(1)+T0(3)+T0(5)+T0(7)
+      VOLVP1=Q(1)+Q(3)+Q(5)+Q(7)
+      VOLTC0=T0(2)+T0(4)+T0(6)+T0(8)
+      VOLTC1=Q(2)+Q(4)+Q(6)+Q(8)
+      VARTC = ( VOLTC1 - VOLTC0 ) / VOLTC0
+      VARVP = ( VOLVP1 - VOLVP0 ) / VOLVP0
+
+      ITER=ITER+1
+      DELTAP=ZERO
+      DO 60, I=1,8
+         DELTAP=DELTAP+(Q(I)-T(I))*(Q(I)-T(I))
+60    CONTINUE
+      PRINT '(9X,A11,I4,A6,E10.2)', ' Itération', ITER,'---> ', DELTAP
+      IF((DELTAP.GT.EPS).AND.(ITER.LT.ITERMAX)) THEN
+        DO 61, I=1,8
+          T(I)=Q(I)
+61      CONTINUE
+        T(20)=Q(20)
+        GOTO 100
+      ENDIF 
+
+      IF(ITER.EQ.1) GOTO 100
+
+      VOLVP0 = T0(1) + T0(3) + T0(5) + T0(7)
+      VOLTC0 = T0(2) + T0(4) + T0(6) + T0(8)
+      VOLVP1 = Q(1)  +  Q(3) +  Q(5) +  Q(7)
+      VOLTC1 = Q(2)  +  Q(4) +  Q(6) +  Q(8)
+      VARTC  =  ( VOLTC1 - VOLTC0 ) / VOLTC0 * 100.0D0
+      VARVP  =  ( VOLVP1 - VOLVP0 ) / VOLVP0 * 100.0D0
+
+C AFFICHE LE RESULTAT
+      PRINT*
+      PRINT '(10X,"===========================================")'
+      PRINT '(10X,A36)', SCENARIO
+      PRINT '(10X,"*******************************************")'
+      PRINT '(12X,A9,3X,3A9)', 'Modes', 'Base', 'New','%'
+      PRINT '(10X,"-------------------------------------------")'
+      DO I=1,8,2
+        PRINT '(12X,A12,3F9.2)', MODES(I), T0(I), Q(I), VAR(I)
+      ENDDO
+      PRINT '(10X,"-----")'
+      PRINT '(12X,A12,3F9.2)','Total VP   ',VOLVP0,VOLVP1,VARVP
+      PRINT '(12X,A12,3F9.2)','Congestion ',
+     &        TOTCONG0,TOTCONG,(TOTCONG-TOTCONG0)/TOTCONG0*100
+      PRINT '(12X,A12,3F9.2)','Pollution ',
+     &        TOTPOL0,TOTPOL,(TOTPOL-TOTPOL0)/TOTPOL0*100
+      PRINT '(10X,"...........................................")'
+      DO I=2,8,2
+        PRINT '(12X,A12,3F9.2)', MODES(I), T0(I), Q(I), VAR(I)
+      ENDDO
+      PRINT '(10X,"-----")'
+      PRINT '(12X,A12,3F9.2)','Total TC   ',VOLTC0,VOLTC1,VARTC
+      PRINT '(10X,"-------------------------------------------")'
+      PRINT '(12X,A12,3A9)', 'Housing    ', 'Base', 'New','% '
+      PRINT '(10X,"-------------------------------------------")'
+      I=13
+      PRINT '(12X,A12,3F9.2)', ' H_CBD    ', T0(I), Q(I), VAR(I)
+      I=15
+      PRINT '(12X,A12,3F9.2)', ' H_SUB    ', T0(I), Q(I), VAR(I)
+      PRINT '(10X,"===========================================")'
+      PRINT* 
+
+C FIN DU PROGRAMME
+      END 
+
+
+C ----------------------------------------
+C LES FONCTIONS ET SOUS-ROUTINES UTILISEES
+C DANS LE PROGRAMME
+C ----------------------------------------
+
+      FUNCTION CES2(X,Y,A,A1,A2,S)
+      IMPLICIT NONE
+      REAL*8 CES2
+      REAL*8 X,Y,A,A1,A2,S
+      REAL*8 R,ONE
+
+      ONE=1.D0
+
+      R=(S-ONE)/S
+
+      CES2= A * ( A1**(ONE-R) * X**R +  
+     1            A2**(ONE-R) * Y**R )**(ONE/R)
+
+      RETURN
+      END 
+
+      FUNCTION PCES2(P1,P2,A,A1,A2,S)
+      IMPLICIT NONE
+      REAL*8 PCES2
+      REAL*8 P1,P2,A,A1,A2,S
+      REAL*8 R,RP
+      REAL*8 ONE
+
+      ONE=1.D0 
+      
+      R=ONE-S 
+      PCES2= A * ( A1 * P1**R +  
+     1             A2 * P2**R )**(ONE/R)
+
+      RETURN
+      END 
+
+      SUBROUTINE CAL2(P1,P2,T1,T2,S,A1,A2)
+      IMPLICIT NONE
+      REAL*8 P1,P2,T1,T2,S,A1,A2
+      REAL*8 R
+
+      R=1.D0/S
+
+      A1=(P1*T1**R/(P1*T1**R+P2*T2**R))**S 
+      A2=(P2*T2**R/(P1*T1**R+P2*T2**R))**S 
+
+      RETURN
+      END
+
+
+      SUBROUTINE QUANTITIES(AA,P,S,Y,A,POL,CONG,OCC,Q,TOTPOL,TOTCONG)
+
+      IMPLICIT NONE
+      REAL*8 AA(21), P(21), S(21), Y(21), A, POL(8), CONG(8), OCC(8)
+      REAL*8 Q(21), TOTPOL, TOTCONG
+      REAL*8 CES2
+      REAL*8 ZERO
+      INTEGER I
+    
+      ZERO=0.D0
+
+      Q(1)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(17)*(P(19)/P(17))**S(19)*
+     2    AA(14)*(P(17)/P(14))**S(17)*
+     3    AA(09)*(P(14)/P(09))**S(14)*
+     4    AA(01)*(P(09)/P(01))**S(09)
+
+      Q(2)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(17)*(P(19)/P(17))**S(19)*
+     2    AA(14)*(P(17)/P(14))**S(17)*
+     3    AA(09)*(P(14)/P(09))**S(14)*
+     4    AA(02)*(P(09)/P(02))**S(09)
+
+      Q(3)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(17)*(P(19)/P(17))**S(19)*
+     2    AA(14)*(P(17)/P(14))**S(17)*
+     3    AA(10)*(P(14)/P(10))**S(14)*
+     4    AA(03)*(P(10)/P(03))**S(10)
+
+      Q(4)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(17)*(P(19)/P(17))**S(19)*
+     2    AA(14)*(P(17)/P(14))**S(17)*
+     3    AA(10)*(P(14)/P(10))**S(14)*
+     4    AA(04)*(P(10)/P(04))**S(10)
+
+      Q(5)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(18)*(P(19)/P(18))**S(19)*
+     2    AA(16)*(P(18)/P(16))**S(18)*
+     3    AA(11)*(P(16)/P(11))**S(16)*
+     4    AA(05)*(P(11)/P(05))**S(11)
+
+      Q(6)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(18)*(P(19)/P(18))**S(19)*
+     2    AA(16)*(P(18)/P(16))**S(18)*
+     3    AA(11)*(P(16)/P(11))**S(16)*
+     4    AA(06)*(P(11)/P(06))**S(11)
+
+      Q(7)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(18)*(P(19)/P(18))**S(19)*
+     2    AA(16)*(P(18)/P(16))**S(18)*
+     3    AA(12)*(P(16)/P(12))**S(16)*
+     4    AA(07)*(P(12)/P(07))**S(12)
+
+      Q(8)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(18)*(P(19)/P(18))**S(19)*
+     2    AA(16)*(P(18)/P(16))**S(18)*
+     3    AA(12)*(P(16)/P(12))**S(16)*
+     4    AA(08)*(P(12)/P(08))**S(12)
+
+      Q(13)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(17)*(P(19)/P(17))**S(19)*
+     2    AA(13)*(P(17)/P(13))**S(17) 
+
+      Q(15)=Y(21)/P(21)* 
+     1    AA(19)*(P(21)/P(19))**S(21)*
+     1    AA(18)*(P(19)/P(18))**S(19)*
+     2    AA(15)*(P(18)/P(15))**S(18) 
+      
+      Q(20)=Y(21)/P(21)*AA(20)*(P(21)/P(20))**S(21) 
+
+      Q(09)=CES2(Q(01),Q(02),A,AA(01),AA(02),S(09))
+      Q(10)=CES2(Q(03),Q(04),A,AA(03),AA(04),S(10))
+      Q(11)=CES2(Q(05),Q(06),A,AA(05),AA(06),S(11))
+      Q(12)=CES2(Q(07),Q(08),A,AA(07),AA(08),S(12))
+      Q(14)=CES2(Q(09),Q(10),A,AA(09),AA(10),S(14))
+      Q(16)=CES2(Q(11),Q(12),A,AA(11),AA(12),S(16))
+      Q(17)=CES2(Q(13),Q(14),A,AA(13),AA(14),S(17))
+      Q(18)=CES2(Q(15),Q(16),A,AA(15),AA(16),S(18))
+      Q(19)=CES2(Q(17),Q(18),A,AA(17),AA(18),S(19))
+      Q(21)=CES2(Q(19),Q(20),A,AA(19),AA(20),S(21))
+
+C CALCUL DES EMISSIONS ET DU VOLUME EQUIVALENT VOITURE (CONGESTION)
+      TOTPOL=ZERO
+      TOTCONG=ZERO
+      DO 10, I=1, 8
+        TOTPOL=TOTPOL+POL(I)*Q(I)/OCC(I)
+        TOTCONG=TOTCONG+CONG(I)*Q(I)/OCC(I)
+10    CONTINUE 
+
+      RETURN
+      END
+
+
+      FUNCTION BPR(V,T0,A,B,K)
+      IMPLICIT NONE
+      REAL*8 BPR, V, T0, A, B, K
+      
+      BPR=T0*(1.D0+A*(V/K)**B)
+
+      RETURN
+      END 
+

+ 0 - 0
empiric/11


+ 0 - 0
empiric/s.dat


+ 62 - 0
empiric/s00.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.4  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- euros/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 43 - 0
empiric/s00.dat.res

@@ -0,0 +1,43 @@
+ Reading file: s00.dat                                           
+          Itération   1 --->   0.53E+01
+          Itération   2 --->   0.75E-01
+          Itération   3 --->   0.13E-01
+          Itération   4 --->   0.23E-02
+          Itération   5 --->   0.41E-03
+          Itération   6 --->   0.71E-04
+          Itération   7 --->   0.13E-04
+          Itération   8 --->   0.22E-05
+          Itération   9 --->   0.39E-06
+          Itération  10 --->   0.68E-07
+          Itération  11 --->   0.12E-07
+          Itération  12 --->   0.21E-08
+          Itération  13 --->   0.37E-09
+          Itération  14 --->   0.65E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    37.89     2.21
+            VP(CBD->SUB)    52.22    53.35     2.16
+            VP(SUB->CBD)    46.73    46.46    -0.58
+            VP(SUB->SUB)   311.30   309.80    -0.48
+          -----
+             Total VP      447.32   447.50     0.04
+             Congestion    453.88   453.26    -0.14
+              Pollution    201.08   200.49    -0.29
+          ...........................................
+            TC(CBD->CBD)    19.43    19.86     2.23
+            TC(CBD->SUB)    23.24    23.74     2.16
+            TC(SUB->CBD)    20.27    20.18    -0.42
+            TC(SUB->SUB)    13.05    12.99    -0.52
+          -----
+             Total TC       75.99    76.77     1.03
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   139.53     5.74
+               H_SUB       391.35   389.30    -0.53
+          ===========================================
+

+ 62 - 0
empiric/s1.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 44 - 0
empiric/s1.dat.res

@@ -0,0 +1,44 @@
+ Reading file: s1.dat                                            
+          Itération   1 --->   0.23E+02
+          Itération   2 --->   0.35E+00
+          Itération   3 --->   0.65E-01
+          Itération   4 --->   0.12E-01
+          Itération   5 --->   0.22E-02
+          Itération   6 --->   0.39E-03
+          Itération   7 --->   0.72E-04
+          Itération   8 --->   0.13E-04
+          Itération   9 --->   0.24E-05
+          Itération  10 --->   0.44E-06
+          Itération  11 --->   0.80E-07
+          Itération  12 --->   0.15E-07
+          Itération  13 --->   0.27E-08
+          Itération  14 --->   0.49E-09
+          Itération  15 --->   0.89E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    37.20     0.34
+            VP(CBD->SUB)    52.22    49.11    -5.95
+            VP(SUB->CBD)    46.73    43.97    -5.91
+            VP(SUB->SUB)   311.30   313.21     0.61
+          -----
+             Total VP      447.32   443.49    -0.86
+             Congestion    453.88   455.19     0.29
+              Pollution    201.08   201.62     0.27
+          ...........................................
+            TC(CBD->CBD)    19.43    19.49     0.29
+            TC(CBD->SUB)    23.24    23.18    -0.28
+            TC(SUB->CBD)    20.27    20.36     0.48
+            TC(SUB->SUB)    13.05    13.15     0.70
+          -----
+             Total TC       75.99    76.17     0.24
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   129.94    -1.53
+               H_SUB       391.35   392.20     0.22
+          ===========================================
+

+ 62 - 0
empiric/s11.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.4  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- euros/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 44 - 0
empiric/s11.dat.res

@@ -0,0 +1,44 @@
+ Reading file: s11.dat                                           
+          Itération   1 --->   0.15E+02
+          Itération   2 --->   0.97E-01
+          Itération   3 --->   0.17E-01
+          Itération   4 --->   0.31E-02
+          Itération   5 --->   0.57E-03
+          Itération   6 --->   0.10E-03
+          Itération   7 --->   0.18E-04
+          Itération   8 --->   0.33E-05
+          Itération   9 --->   0.60E-06
+          Itération  10 --->   0.11E-06
+          Itération  11 --->   0.19E-07
+          Itération  12 --->   0.35E-08
+          Itération  13 --->   0.63E-09
+          Itération  14 --->   0.11E-09
+          Itération  15 --->   0.21E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    38.01     2.54
+            VP(CBD->SUB)    52.22    50.16    -3.93
+            VP(SUB->CBD)    46.73    43.72    -6.44
+            VP(SUB->SUB)   311.30   311.74     0.14
+          -----
+             Total VP      447.32   443.63    -0.82
+             Congestion    453.88   454.57     0.15
+              Pollution    201.08   201.03    -0.03
+          ...........................................
+            TC(CBD->CBD)    19.43    19.92     2.51
+            TC(CBD->SUB)    23.24    23.67     1.85
+            TC(SUB->CBD)    20.27    20.28     0.07
+            TC(SUB->SUB)    13.05    13.08     0.18
+          -----
+             Total TC       75.99    76.95     1.26
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   137.37     4.10
+               H_SUB       391.35   390.18    -0.30
+          ===========================================
+

+ 62 - 0
empiric/s2.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.88  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 41 - 0
empiric/s2.dat.res

@@ -0,0 +1,41 @@
+ Reading file: s2.dat                                            
+          Itération   1 --->   0.34E+02
+          Itération   2 --->   0.14E-02
+          Itération   3 --->   0.24E-03
+          Itération   4 --->   0.43E-04
+          Itération   5 --->   0.76E-05
+          Itération   6 --->   0.13E-05
+          Itération   7 --->   0.24E-06
+          Itération   8 --->   0.42E-07
+          Itération   9 --->   0.75E-08
+          Itération  10 --->   0.13E-08
+          Itération  11 --->   0.24E-09
+          Itération  12 --->   0.42E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    34.34    -7.37
+            VP(CBD->SUB)    52.22    49.10    -5.96
+            VP(SUB->CBD)    46.73    44.04    -5.77
+            VP(SUB->SUB)   311.30   314.36     0.98
+          -----
+             Total VP      447.32   441.84    -1.22
+             Congestion    453.88   453.80    -0.02
+              Pollution    201.08   202.03     0.47
+          ...........................................
+            TC(CBD->CBD)    19.43    19.73     1.53
+            TC(CBD->SUB)    23.24    23.17    -0.30
+            TC(SUB->CBD)    20.27    20.47     0.99
+            TC(SUB->SUB)    13.05    13.18     0.98
+          -----
+             Total TC       75.99    76.55     0.73
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   128.72    -2.46
+               H_SUB       391.35   393.25     0.49
+          ===========================================
+

+ 62 - 0
empiric/s22.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.4  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.88  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 43 - 0
empiric/s22.dat.res

@@ -0,0 +1,43 @@
+ Reading file: s22.dat                                           
+          Itération   1 --->   0.19E+02
+          Itération   2 --->   0.11E+00
+          Itération   3 --->   0.19E-01
+          Itération   4 --->   0.34E-02
+          Itération   5 --->   0.59E-03
+          Itération   6 --->   0.10E-03
+          Itération   7 --->   0.18E-04
+          Itération   8 --->   0.31E-05
+          Itération   9 --->   0.55E-06
+          Itération  10 --->   0.96E-07
+          Itération  11 --->   0.17E-07
+          Itération  12 --->   0.29E-08
+          Itération  13 --->   0.52E-09
+          Itération  14 --->   0.90E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    35.09    -5.35
+            VP(CBD->SUB)    52.22    50.15    -3.95
+            VP(SUB->CBD)    46.73    43.79    -6.30
+            VP(SUB->SUB)   311.30   312.91     0.52
+          -----
+             Total VP      447.32   441.94    -1.20
+             Congestion    453.88   453.14    -0.16
+              Pollution    201.08   201.44     0.18
+          ...........................................
+            TC(CBD->CBD)    19.43    20.17     3.78
+            TC(CBD->SUB)    23.24    23.66     1.82
+            TC(SUB->CBD)    20.27    20.39     0.59
+            TC(SUB->SUB)    13.05    13.12     0.47
+          -----
+             Total TC       75.99    77.33     1.76
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   136.08     3.12
+               H_SUB       391.35   391.25    -0.03
+          ===========================================
+

+ 62 - 0
empiric/s3.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.30  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.33  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 44 - 0
empiric/s3.dat.res

@@ -0,0 +1,44 @@
+ Reading file: s3.dat                                            
+          Itération   1 --->   0.17E+03
+          Itération   2 --->   0.18E+02
+          Itération   3 --->   0.25E+01
+          Itération   4 --->   0.34E+00
+          Itération   5 --->   0.46E-01
+          Itération   6 --->   0.62E-02
+          Itération   7 --->   0.84E-03
+          Itération   8 --->   0.11E-03
+          Itération   9 --->   0.15E-04
+          Itération  10 --->   0.21E-05
+          Itération  11 --->   0.29E-06
+          Itération  12 --->   0.39E-07
+          Itération  13 --->   0.53E-08
+          Itération  14 --->   0.71E-09
+          Itération  15 --->   0.97E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    38.66     4.27
+            VP(CBD->SUB)    52.22    50.58    -3.12
+            VP(SUB->CBD)    46.73    44.35    -5.09
+            VP(SUB->SUB)   311.30   301.64    -3.10
+          -----
+             Total VP      447.32   435.24    -2.70
+             Congestion    453.88   442.65    -2.47
+              Pollution    201.08   195.13    -2.96
+          ...........................................
+            TC(CBD->CBD)    19.43    20.36     4.76
+            TC(CBD->SUB)    23.24    23.85     2.60
+            TC(SUB->CBD)    20.27    21.19     4.59
+            TC(SUB->SUB)    13.05    13.25     1.46
+          -----
+             Total TC       75.99    78.64     3.49
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   133.59     1.23
+               H_SUB       391.35   387.10    -1.09
+          ===========================================
+

+ 62 - 0
empiric/s33.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.4  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.30  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.33  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 44 - 0
empiric/s33.dat.res

@@ -0,0 +1,44 @@
+ Reading file: s33.dat                                           
+          Itération   1 --->   0.22E+03
+          Itération   2 --->   0.20E+02
+          Itération   3 --->   0.27E+01
+          Itération   4 --->   0.36E+00
+          Itération   5 --->   0.48E-01
+          Itération   6 --->   0.64E-02
+          Itération   7 --->   0.86E-03
+          Itération   8 --->   0.12E-03
+          Itération   9 --->   0.15E-04
+          Itération  10 --->   0.21E-05
+          Itération  11 --->   0.28E-06
+          Itération  12 --->   0.37E-07
+          Itération  13 --->   0.50E-08
+          Itération  14 --->   0.67E-09
+          Itération  15 --->   0.90E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    39.50     6.55
+            VP(CBD->SUB)    52.22    51.67    -1.05
+            VP(SUB->CBD)    46.73    44.10    -5.63
+            VP(SUB->SUB)   311.30   300.16    -3.58
+          -----
+             Total VP      447.32   435.43    -2.66
+             Congestion    453.88   442.06    -2.60
+              Pollution    201.08   194.54    -3.25
+          ...........................................
+            TC(CBD->CBD)    19.43    20.81     7.07
+            TC(CBD->SUB)    23.24    24.36     4.79
+            TC(SUB->CBD)    20.27    21.10     4.14
+            TC(SUB->SUB)    13.05    13.18     0.93
+          -----
+             Total TC       75.99    79.44     4.54
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   141.23     7.03
+               H_SUB       391.35   385.05    -1.61
+          ===========================================
+

+ 62 - 0
empiric/s4.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.30  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.33  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 44 - 0
empiric/s4.dat.res

@@ -0,0 +1,44 @@
+ Reading file: s4.dat                                            
+          Itération   1 --->   0.23E+03
+          Itération   2 --->   0.22E+02
+          Itération   3 --->   0.29E+01
+          Itération   4 --->   0.38E+00
+          Itération   5 --->   0.51E-01
+          Itération   6 --->   0.67E-02
+          Itération   7 --->   0.88E-03
+          Itération   8 --->   0.12E-03
+          Itération   9 --->   0.15E-04
+          Itération  10 --->   0.20E-05
+          Itération  11 --->   0.27E-06
+          Itération  12 --->   0.36E-07
+          Itération  13 --->   0.47E-08
+          Itération  14 --->   0.62E-09
+          Itération  15 --->   0.82E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    38.52     3.90
+            VP(CBD->SUB)    52.22    53.81     3.05
+            VP(SUB->CBD)    46.73    47.14     0.87
+            VP(SUB->SUB)   311.30   299.72    -3.72
+          -----
+             Total VP      447.32   439.19    -1.82
+             Congestion    453.88   441.36    -2.76
+              Pollution    201.08   194.61    -3.22
+          ...........................................
+            TC(CBD->CBD)    19.43    20.29     4.44
+            TC(CBD->SUB)    23.24    23.91     2.88
+            TC(SUB->CBD)    20.27    21.09     4.06
+            TC(SUB->SUB)    13.05    13.15     0.75
+          -----
+             Total TC       75.99    78.45     3.23
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   135.68     2.82
+               H_SUB       391.35   386.23    -1.31
+          ===========================================
+

+ 62 - 0
empiric/s44.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.4  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.30  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.33  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 44 - 0
empiric/s44.dat.res

@@ -0,0 +1,44 @@
+ Reading file: s44.dat                                           
+          Itération   1 --->   0.29E+03
+          Itération   2 --->   0.24E+02
+          Itération   3 --->   0.31E+01
+          Itération   4 --->   0.40E+00
+          Itération   5 --->   0.52E-01
+          Itération   6 --->   0.69E-02
+          Itération   7 --->   0.89E-03
+          Itération   8 --->   0.12E-03
+          Itération   9 --->   0.15E-04
+          Itération  10 --->   0.20E-05
+          Itération  11 --->   0.26E-06
+          Itération  12 --->   0.34E-07
+          Itération  13 --->   0.44E-08
+          Itération  14 --->   0.57E-09
+          Itération  15 --->   0.75E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    39.36     6.18
+            VP(CBD->SUB)    52.22    54.97     5.28
+            VP(SUB->CBD)    46.73    46.86     0.29
+            VP(SUB->SUB)   311.30   298.21    -4.20
+          -----
+             Total VP      447.32   439.41    -1.77
+             Congestion    453.88   440.77    -2.89
+              Pollution    201.08   194.02    -3.51
+          ...........................................
+            TC(CBD->CBD)    19.43    20.74     6.76
+            TC(CBD->SUB)    23.24    24.43     5.10
+            TC(SUB->CBD)    20.27    21.00     3.60
+            TC(SUB->SUB)    13.05    13.08     0.21
+          -----
+             Total TC       75.99    79.25     4.29
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   143.46     8.72
+               H_SUB       391.35   384.14    -1.84
+          ===========================================
+

+ 62 - 0
empiric/sXX.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.2 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.2 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.0 4.0 1.0 4.0 1.0 4.0 1.0 4.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 41 - 0
empiric/sXX.dat.res

@@ -0,0 +1,41 @@
+ Reading file: sXX.dat                                           
+          Itération   1 --->   0.19E+02
+          Itération   2 --->   0.24E+01
+          Itération   3 --->   0.19E+00
+          Itération   4 --->   0.15E-01
+          Itération   5 --->   0.12E-02
+          Itération   6 --->   0.99E-04
+          Itération   7 --->   0.80E-05
+          Itération   8 --->   0.64E-06
+          Itération   9 --->   0.51E-07
+          Itération  10 --->   0.41E-08
+          Itération  11 --->   0.33E-09
+          Itération  12 --->   0.27E-10
+
+          ===========================================
+          Tarification VP CBD                 
+          *******************************************
+                Modes        Base      New        %
+          -------------------------------------------
+            VP(CBD->CBD)    37.07    37.63     1.50
+            VP(CBD->SUB)    52.22    49.48    -5.23
+            VP(SUB->CBD)    46.73    43.74    -6.40
+            VP(SUB->SUB)   311.30   314.12     0.91
+          -----
+             Total VP      447.32   444.97    -0.53
+             Congestion    341.31   338.29    -0.89
+              Pollution    201.08   202.29     0.60
+          ...........................................
+            TC(CBD->CBD)    19.43    19.76     1.67
+            TC(CBD->SUB)    23.24    23.34     0.43
+            TC(SUB->CBD)    20.27    20.53     1.32
+            TC(SUB->SUB)    13.05    13.14     0.64
+          -----
+             Total TC       75.99    76.77     1.02
+          -------------------------------------------
+             Housing         Base      New       % 
+          -------------------------------------------
+               H_CBD       131.96   130.82    -0.86
+               H_SUB       391.35   391.87     0.13
+          ===========================================
+

+ 0 - 0
empiric/sig11.dat


BIN
empiric/sigma/model


+ 0 - 0
empiric/sigma/sig.dat


+ 62 - 0
empiric/sigma/sig1.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+15.0
+:2value
+15.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 62 - 0
empiric/sigma/sig11.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.4  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- euros/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 62 - 0
empiric/sigma/sig2.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.88  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.9 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.9 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 62 - 0
empiric/sigma/sig22.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.4  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.88  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 62 - 0
empiric/sigma/sig3.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.30  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.33  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 62 - 0
empiric/sigma/sig33.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.4  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.30  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.33  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 62 - 0
empiric/sigma/sig4.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.30  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.33  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 62 - 0
empiric/sigma/sig44.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.4  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.30  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.33  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+18. 20. 24. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 14 - 0
empiric/sigma/sigma.sh

@@ -0,0 +1,14 @@
+#!/bin/bash
+#
+
+f1="../s$1.dat"
+f2="sig$1.dat"
+
+./model $f1 > tmp1
+./model $f2 > tmp2
+
+diff $f1 $f2 | tail -4
+diff -y  tmp1 tmp2 | awk 'NF==9 && (/VP\(/ || /TC\(/) {print $0, "     "$9-$4;next;} {print $0;}' | tail -30
+
+rm -f tmp1 tmp2
+

+ 62 - 0
empiric/sigma/sp1.dat

@@ -0,0 +1,62 @@
+:scenario
+"Tarification VP CBD" 
+
+:volume transport
+37.072  19.431  52.216  23.241  46.731  20.265  311.302  13.055
+
+:housing stock
+131.961  391.353
+
+:rent of housing
+1.5  1.0
+:2rent of housing
+1.5  1.0
+
+:alpha (depense dans le bien composite)
+0.60 
+
+:value of time (value of time -- DT/h)
+10.0
+:2value
+10.0
+
+:cout monétaire -- euro/km
+0.80  0.5  0.50  0.21  0.50  0.21  0.3  0.125
+:2cout monétaire -- euro/km
+0.80  0.5  0.55  0.21  0.55  0.21  0.3  0.125
+
+:distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+:2distance -- km
+2. 3.0  5. 7. 5. 7. 8. 12.
+
+:vitesse -- km/h
+22. 20. 54. 22. 24. 22. 35. 25.
+:2vitesse -- km/h
+22. 20. 54. 22. 24. 22. 35. 25.
+
+:prix du bien composite
+1.0
+:2prix
+1.0 
+
+:elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+:2elasticite
+1.6 1.1 1.3 1.05 1.3 1.3 0.5  0.5  1.9 0.3 
+
+:pollution (emissions co2 par mode de transport)
+0.120 0.150 0.200 0.0 0.0 0.100 0.90 0.020 0.015 
+:congestion (equivalent voiture sur la route)
+1.2 1.0 0.4 0.1 0.0 1.8 1.9 0.0 4.0
+:occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:2occupation (nombre de passagers par véhicules)
+1.2 30.7 1.0 40.0 1.1 40.0 1.5 40.0 
+:abpr
+0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 0.15 
+:bbpr
+4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 4.0 
+:tbpr
+1.5 1.50 1.20 1.10 1.01 1.50 1.40 1.10 1.60
+

+ 14 - 0
empiric/sigma/speed.sh

@@ -0,0 +1,14 @@
+#!/bin/bash
+#
+
+f1="../s$1.dat"
+f2="sp$1.dat"
+
+./model $f1 > tmp1
+./model $f2 > tmp2
+
+diff $f1 $f2 | tail -4
+diff -y  tmp1 tmp2 | awk 'NF==9 && (/VP\(/ || /TC\(/) {print $0, "     "$9-$4;next;} {print $0;}' | tail -30
+
+rm -f tmp1 tmp2
+