swihart / event

Event history procedures and models
GNU General Public License v2.0
1 stars 0 forks source link

WinBuilder Errors, Warnings, and Notes. #3

Open swihart opened 7 years ago

swihart commented 7 years ago

Out of all the warnings listed below, the only one that shows up CHECK is

* checking whether package 'event' can be installed ... WARNING
Found the following significant warnings:
  Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
See 'd:/RCompile/CRANguest/R-devel/event.Rcheck/00install.out' for details.

Here's 00install:

* installing *source* package 'event' ...
** libs

*** arch - i386
d:/Compiler/gcc-4.9.3/mingw_32/bin/gcc  -I"D:/RCompile/recent/R/include" -DNDEBUG     -I"d:/Compiler/gcc-4.9.3/local330/include"     -pedantic -O3 -Wall  -std=gnu99 -mtune=core2 -c ksurvb.c -o ksurvb.o
ksurvb.c: In function 'ksurvb':
ksurvb.c:204:49: warning: 'ly' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                 ^
ksurvb.c:178:64: warning: 'h' may be used uninitialized in this function [-Wmaybe-uninitialized]
  *like-=(c>1?lgammafn(a1)-lgammafn(a)-lgammafn(c+1):c*log(a))+c*h;
                                                                ^
ksurvb.c:204:49: warning: 'bt' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                 ^
ksurvb.c:98:13: warning: 'Rf_beta' may be used uninitialized in this function [-Wmaybe-uninitialized]
      else bt+=beta;}
             ^
ksurvb.c:216:14: warning: 'om' may be used uninitialized in this function [-Wmaybe-uninitialized]
  case 1: b=om*(b1-b)+delta; break;
              ^
ksurvb.c:204:48: warning: 'lambda' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                ^
ksurvb.c:158:77: warning: 'intercept' may be used uninitialized in this function [-Wmaybe-uninitialized]
      h=-yy/lambda+(1/(lambda*bt)+1)*log((lambda+intercept)/(lambda+intercept*exp(-bt*yy)));
                                                                             ^
ksurvb.c:181:34: warning: 'family' may be used uninitialized in this function [-Wmaybe-uninitialized]
  if(*pfamily)*like-=(c>0)*(family-c)*log(b1)-a*(pow(b1,family)-pow(b,family))/family;
                                  ^
ksurvb.c:208:12: warning: 'omega' may be used uninitialized in this function [-Wmaybe-uninitialized]
  case 2: om=pow(omega,yy); a=om*a1+(1-om)*delta; break;
            ^
ksurvb.c: In function 'frailb':
ksurvb.c:388:48: warning: 'lambda' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp)));
                                                ^
ksurvb.c:390:4: warning: 'H' may be used uninitialized in this function [-Wmaybe-uninitialized]
  b1+=H;
    ^
ksurvb.c:388:49: warning: 'ly' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp)));
                                                 ^
ksurvb.c:266:17: warning: 'yy' may be used uninitialized in this function [-Wmaybe-uninitialized]
  if(*model>=5)ly=log(yy);
                 ^
ksurvb.c:284:13: warning: 'bt' may be used uninitialized in this function [-Wmaybe-uninitialized]
      bt=exp(log(bt)+exp(p[*nccov+*birth+*tvc+2]*y[nm])*res);
             ^
ksurvb.c:274:13: warning: 'Rf_beta' may be used uninitialized in this function [-Wmaybe-uninitialized]
      else bt+=beta;}
             ^
ksurvb.c:340:61: warning: 'intercept' may be used uninitialized in this function [-Wmaybe-uninitialized]
      l1+=-yy/lambda+log((lambda+intercept)/(lambda+intercept*exp(-bt*yy)))/((lambda*bt)+1);
                                                             ^
d:/Compiler/gcc-4.9.3/mingw_32/bin/gcc  -I"D:/RCompile/recent/R/include" -DNDEBUG     -I"d:/Compiler/gcc-4.9.3/local330/include"     -pedantic -O3 -Wall  -std=gnu99 -mtune=core2 -c ksurvg.c -o ksurvg.o
ksurvg.c: In function 'ksurvg':
ksurvg.c:200:48: warning: 'lambda' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                ^
ksurvg.c:200:49: warning: 'ly' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                 ^
ksurvg.c:168:4: warning: 'l1' may be used uninitialized in this function [-Wmaybe-uninitialized]
  if(l1<1e-20)l1=1e-20;
    ^
ksurvg.c:200:49: warning: 'bt' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                 ^
ksurvg.c:88:13: warning: 'Rf_beta' may be used uninitialized in this function [-Wmaybe-uninitialized]
      else bt+=beta;}
             ^
ksurvg.c:213:12: warning: 'om' may be used uninitialized in this function [-Wmaybe-uninitialized]
  case 2: b=pow(H,-om)*delta; break;
            ^
ksurvg.c:170:4: warning: 'H' may be used uninitialized in this function [-Wmaybe-uninitialized]
  if(H>1e20)H=1e20;
    ^
ksurvg.c:148:65: warning: 'intercept' may be used uninitialized in this function [-Wmaybe-uninitialized]
      l1=exp(-yy/lambda)*pow((lambda+intercept)/(lambda+intercept*exp(-bt*yy)),1/(lambda*bt)+1);
                                                                 ^
ksurvg.c:204:12: warning: 'omega' may be used uninitialized in this function [-Wmaybe-uninitialized]
  case 2: om=pow(omega,yy); a=om*a1+(1-om)*delta; break;
            ^
d:/Compiler/gcc-4.9.3/mingw_32/bin/gfortran      -pedantic -fbounds-check -O3  -mtune=core2 -c survkit.f -o survkit.o
Warning: Nonconforming tab character in column 1 of line 334
Warning: Nonconforming tab character in column 1 of line 350
Warning: Nonconforming tab character in column 1 of line 567
Warning: Nonconforming tab character in column 1 of line 1194
Warning: Nonconforming tab character in column 1 of line 1509
Warning: Nonconforming tab character in column 1 of line 1732
Warning: Nonconforming tab character in column 1 of line 1735
Warning: Nonconforming tab character in column 1 of line 2025
Warning: Nonconforming tab character in column 1 of line 2217
Warning: Nonconforming tab character in column 1 of line 2454
Warning: Nonconforming tab character in column 1 of line 2456
Warning: Nonconforming tab character in column 1 of line 2479
Warning: Nonconforming tab character in column 1 of line 2480
Warning: Nonconforming tab character in column 1 of line 2490
Warning: Nonconforming tab character in column 1 of line 2510
Warning: Nonconforming tab character in column 1 of line 2517
Warning: Nonconforming tab character in column 1 of line 2518
Warning: Nonconforming tab character in column 6 of line 2519
Warning: Nonconforming tab character in column 1 of line 2520
Warning: Nonconforming tab character in column 1 of line 2523
Warning: Nonconforming tab character in column 5 of line 2526
Warning: Nonconforming tab character in column 1 of line 2527
Warning: Nonconforming tab character in column 1 of line 2532
Warning: Nonconforming tab character in column 1 of line 2537
Warning: Nonconforming tab character in column 1 of line 2543
Warning: Nonconforming tab character in column 1 of line 2572
Warning: Nonconforming tab character in column 1 of line 2577
Warning: Nonconforming tab character in column 1 of line 2582
Warning: Nonconforming tab character in column 6 of line 2587
Warning: Nonconforming tab character in column 1 of line 2589
Warning: Nonconforming tab character in column 1 of line 2590
Warning: Nonconforming tab character in column 6 of line 2591
Warning: Nonconforming tab character in column 1 of line 2592
Warning: Nonconforming tab character in column 1 of line 2597
Warning: Nonconforming tab character in column 1 of line 2603
Warning: Nonconforming tab character in column 1 of line 2725
Warning: Nonconforming tab character in column 1 of line 2733
Warning: Nonconforming tab character in column 1 of line 2737
Warning: Nonconforming tab character in column 1 of line 2738
Warning: Nonconforming tab character in column 1 of line 2739
Warning: Nonconforming tab character in column 1 of line 2740
Warning: Nonconforming tab character in column 1 of line 2742
Warning: Nonconforming tab character in column 1 of line 2743
Warning: Nonconforming tab character in column 1 of line 2745
Warning: Nonconforming tab character in column 1 of line 2849
Warning: Nonconforming tab character in column 5 of line 2889
Warning: Nonconforming tab character in column 1 of line 2892
Warning: Nonconforming tab character in column 1 of line 2906
Warning: Nonconforming tab character in column 5 of line 2938
Warning: Nonconforming tab character in column 1 of line 2939
Warning: Nonconforming tab character in column 1 of line 2941
Warning: Nonconforming tab character in column 1 of line 2966
Warning: Nonconforming tab character in column 1 of line 2979
Warning: Nonconforming tab character in column 5 of line 3010
Warning: Nonconforming tab character in column 1 of line 3059
Warning: Nonconforming tab character in column 1 of line 3066
Warning: Nonconforming tab character in column 3 of line 3079
Warning: Nonconforming tab character in column 1 of line 3091
Warning: Nonconforming tab character in column 1 of line 3093
Warning: Nonconforming tab character in column 1 of line 3094
Warning: Nonconforming tab character in column 1 of line 3095
Warning: Nonconforming tab character in column 3 of line 3098
Warning: Nonconforming tab character in column 1 of line 3100
Warning: Nonconforming tab character in column 1 of line 3195
Warning: Nonconforming tab character in column 1 of line 3196
Warning: Nonconforming tab character in column 1 of line 3203
Warning: Nonconforming tab character in column 1 of line 3232
Warning: Nonconforming tab character in column 1 of line 3416
Warning: Nonconforming tab character in column 1 of line 5215
Warning: Nonconforming tab character in column 1 of line 5216
Warning: Nonconforming tab character in column 1 of line 5217
Warning: Nonconforming tab character in column 1 of line 5218
Warning: Nonconforming tab character in column 1 of line 5458
Warning: Nonconforming tab character in column 1 of line 5459
Warning: Nonconforming tab character in column 1 of line 5460
Warning: Nonconforming tab character in column 1 of line 5461
Warning: Nonconforming tab character in column 1 of line 5463
Warning: Nonconforming tab character in column 1 of line 5464
Warning: Nonconforming tab character in column 1 of line 5687
Warning: Nonconforming tab character in column 1 of line 5904
Warning: Nonconforming tab character in column 1 of line 6616
Warning: Nonconforming tab character in column 1 of line 7811
Warning: Nonconforming tab character in column 1 of line 7812
Warning: Nonconforming tab character in column 1 of line 7851
Warning: Nonconforming tab character in column 1 of line 8629
Warning: Nonconforming tab character in column 1 of line 8759
survkit.f:55.12:

      REAL*8 SQUANT(NQUANT),xtabl(nrr,nccov),xtabl2(nrr2,nccov)         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:56.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA)                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:57.12:

      REAL*8 HESS(NDIMAX,NDIMAX),surv(nstimax*nrr,3)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:72.12:

      REAL*8 F,W,OBJ,LOB,UPB,BEST,DFMIN                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:73.12:

      REAL*8 EPS_BF,DLDET,DLDET0,XLIK(2)                                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:74.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),STORBETA(NDIMAX,0:NPGAUSS)      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:75.12:

      REAL*8 STD(NDIMAX),BOUND(NCCOV+NDCOV,3)                           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:76.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:77.12:

      REAL*8 BETAWOC(2*MXSTRA+3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:78.12:

      REAL*8 WGAUSS(5,5),XGAUSS(5,5),XMOM(0:3),XMOMP(2),W2              
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:79.12:

      REAL*8 OBJ0,XMUK,XMUKM1,SIGK,SIGKM1,R1,R2,VAL0,VAL1,GVAL          
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:80.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:450.12:

      REAL*8 HESS(NDIMAX,NDIMAX),VALRHO(MXSTRA)                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:451.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DIAG(NDIMAX),W(NWORK)           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:452.12:

      REAL*8 STD(NDIMAX),DLDET,OBJ,EPS_BF                               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:453.12:

      REAL*8 F,XTOL,GTOL,STPMIN,STPMAX,BOUND(NCCOV+NDCOV,3)             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:454.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:539.12:

      REAL*8 SUMT,EPS_BF                                                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:540.12:

      REAL*8 BETA(NDIMAX),XGAM(0:NCCOV+NDCOV),BETAWOC(2*MXSTRA+3)       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:541.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA),W1                  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:542.12:

      REAL*8 SQUANT(NQUANT),xtabl(nrr,nccov),xtim                       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:543.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA),xtabl2(nrr2,nccov)          
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:961.12:

      REAL*8 HESS(NDIMAX,NDIMAX),EPS_BF                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:962.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),BOUND(NCCOV+NDCOV,3)            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:963.12:

      REAL*8 FC,OBJ,XC,XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)          
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1019.12:

      REAL*8 GAM0,XNQGAM,OMQGAM,R1GAM,OMEG,EPS_BF,CONST                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1020.12:

      REAL*8 F,U,W,W1,W2,W3,W4,XNS,XNQ,XCOV,X,DM1(7)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1021.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DOMEG(NDIMAX)                   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1022.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1023.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA)                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1024.12:

      REAL*8 RHO,TRHO,TPRERHO,LRHO,DLTIM,DLPRETIM                       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1025.12:

      REAL*8 GAMLOG,DIGAMA,GAMVAR,XNSFIX,BOUND(NCCOV+NDCOV,3)           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1026.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1027.12:

      REAL*8 BETAWOC(2*MXSTRA+3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1599.12:

      REAL*8 HESS(NDIMAX,NDIMAX),D2OMEG(NDIMAX,NDIMAX)                  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1600.12:

      REAL*8 GAM0,CONST,XNQGAM,OMQGAM,R1GAM,R2GAM,R3GAM,OMEG            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1601.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1602.12:

      REAL*8 F,U,W,W1,W2,W3,W4,W5,XNS,XNQ,XCOV,XCOV2,X,DM1(7)           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1603.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DOMEG(NDIMAX),DIAG2OM(NDIMAX)   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1604.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA)                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1605.12:

      REAL*8 RHO,TRHO,TPRERHO,LRHO,DLTIM,DLPRETIM                       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1606.12:

      REAL*8 GAMLOG,DIGAMA,TRIGAM,GAMVAR,XNSFIX                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1607.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1608.12:

      REAL*8 DLDET,WADD,WADD1,WADD2,BOUND(NCCOV+NDCOV,3)                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1609.12:

      REAL*8 STD(NDIMAX),EPS_BF                                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1610.12:

      REAL*8 BETAWOC(2*MXSTRA+3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1816.38:

                 IF (IGPM.GT.0) THEN                                    
                                      1
Warning: Nonconforming tab character at (1)
survkit.f:2479.12:

      REAL*8 SQUANT(NQUANT),surv(nstimax*nrr,3)                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2480.12:

      REAL*8 CUM_RISK,U,W1,W2,W3,TRHO,XRHO,OMEG,EPS_BF                  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2481.12:

      REAL*8 SX,RHO,XCOV,DLXST,REST(NSTIMAX)                            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2482.12:

      REAL*8 BETA(NDIMAX),TPRERHO,LRHO,DLTIM                            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2483.12:

      REAL*8 BETAWOC(2*MXSTRA+3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2484.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA)                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2485.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2664.12:

      REAL*8 X(N),G(N),DIAG(N),W(N*(2*M+1)+2*M)                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2665.12:

      REAL*8 F,EPS,EPS2,XTOL                                            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2841.15:

         REAL*8 GTOL,STPMIN,STPMAX                                      
               1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2884.12:

      REAL*8 ONE,ZERO,GNORM,DDOT,STP1,FTOL,                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2898.72:

      GO TO (172,100) IFLAG                                             
                                                                        1
Warning: Obsolescent feature: Computed GOTO at (1)
survkit.f:2909.72:

 30      IF (DIAG(I).LE.ZERO) GO TO 195                                 
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 30 at (1)
survkit.f:2912.72:

 40      DIAG(I)= 1.0D0                                                 
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 40 at (1)
survkit.f:2933.72:

 50   W(ISPT+I)= -G(I)*DIAG(I)                                          
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 50 at (1)
survkit.f:2965.72:

   90    DIAG(I)= YS/YY                                                 
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 90 at (1)
survkit.f:2973.72:

 110    IF (DIAG(I).LE.ZERO) GO TO 195                                  
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 110 at (1)
survkit.f:2985.72:

 112  W(I)= -G(I)                                                       
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 112 at (1)
survkit.f:2998.72:

 130  W(I)=DIAG(I)*W(I)                                                 
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 130 at (1)
survkit.f:3015.72:

 160   W(ISPT+POINT*N+I)= W(I)                                          
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 160 at (1)
survkit.f:3024.72:

 170  W(I)=G(I)                                                         
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 170 at (1)
survkit.f:3041.72:

 175  W(IYPT+NPT+I)= G(I)-W(I)                                          
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 175 at (1)
survkit.f:3085.12:

      REAL*8 GTOL,STPMIN,STPMAX                                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3103.12:

      REAL*8 dx(n),dy(n),da,zero                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3208.12:

      REAL*8 F,STP,FTOL,GTOL,XTOL,STPMIN,STPMAX                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3209.12:

      REAL*8 X(N),G(N),S(N),WA(N)                                       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3335.12:

      REAL*8 DG,DGM,DGINIT,DGTEST,DGX,DGXM,DGY,DGYM,                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3513.12:

      REAL*8 STX,FX,DX,STY,FY,DY,STP,FP,DP,STPMIN,STPMAX                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3572.12:

      REAL*8 GAMMA,P,Q,R,S,SGND,STPC,STPF,STPQ,THETA,ZERO               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3745.12:

      REAL*8 AX,BX,TOL,OBJ                                              
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3805.12:

      REAL*8 HESS(NDIMAX,NDIMAX),BOUND(NCCOV+NDCOV,3)                   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3806.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3807.12:

      REAL*8 A,B,C,D,E,EPS,XM,P,Q,R,TOL1,TOL2,U,V,W                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3808.12:

      REAL*8 FU,FV,FW,FX,X,BETA(NDIMAX)                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3809.12:

      REAL*8 DABS,DSQRT,DSIGN                                           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4081.12:

      REAL*8 X(NDIMAX),Y(NDIMAX),T,AMED,HOLD                            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4188.12:

      REAL*8 FUNCTION GAMLOG(XVALUE)                                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4195.12:

      REAL*8 ALR2PI, FOUR, HALF, ONE, ONEP5, R1(9), R2(9),              
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4293.12:

      REAL*8 DIGAMA,ZERO, HALF, ONE                                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4294.12:

      REAL*8 R,S,C,S3,S4,S5,D1,Y,X                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4337.12:

      real*8 trigam,a, b, one, half, b2, b4, b6,b8, x, y, z, zero       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4409.12:

      REAL*8 TOL                                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4413.12:

      REAL*8  A(LDA,*),DDOT,T,S                                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4646.12:

      REAL*8 F,W,OBJ,LOB,UPB,BEST,DFMIN                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4647.12:

      REAL*8 DLDET,XCOEF(MXEF),EPS_BF                                   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4648.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX)                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4649.12:

      REAL*8 XLIK(2),BOUND(NCCOV+NDCOV,3)                               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4650.12:

      REAL*8 STD(NDIMAX),STORBETA(NDIMAX,0:NPGAUSS)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4651.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4652.12:

      REAL*8 WGAUSS(5,5),XGAUSS(5,5),XMOM(0:3),XMOMP(2),W2              
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4653.12:

      REAL*8 OBJ0,XMUK,XMUKM1,SIGK,SIGKM1,R1,R2,VAL0,VAL1,GVAL          
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4654.12:

      REAL*8 SQUANT(NQUANT),xtabl(nrr,nccov),xtabl2(nrr2,nccov)         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4655.12:

      REAL*8 HESS(NDIMAX,NDIMAX),valrho(MXSTRA),km(ut,4),resid(ut,3)    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4656.12:

      real*8 surv(nstimax*nrr,3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4954.12:

      REAL*8 CONST                                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4966.12:

      REAL*8 CUM_RISK,F,U,UMINUS,W,WMINUS,XFAIL,XCOV,R,X,DM1(7)         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4967.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DC_RISK(NDIMAX)                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4968.12:

      REAL*8 GAMLOG,XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4969.12:

      REAL*8 XCOEF(MXEF),BOUND(NCCOV+NDCOV,3)                           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5327.12:

      REAL*8 CONST                                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5339.12:

      REAL*8 XCOEF(MXEF)                                                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5340.12:

      REAL*8 CUM_RISK,F,U,UMINUS,W,WMINUS,XFAIL,XCOV,XCOV2,R,X,DM1(7)   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5341.12:

      REAL*8 DLDET                                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5342.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DC_RISK(NDIMAX)                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5343.12:

      REAL*8 GAMLOG,HESS(NDIMAX,NDIMAX),STD(NDIMAX)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5345.12:

      REAL*8 D2C_RISK(NDIMAX,NDIMAX),BOUND(NCCOV+NDCOV,3)               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5346.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5949.12:

      REAL*8 km(ut,4),resid(ut,3),xic,xmart,xdev                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5953.12:

      real*8 surv(nstimax*nrr,3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5955.12:

      REAL*8 XCOEF(MXEF)                                                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5956.12:

      REAL*8 XJUMP(NTIMMAX),XLAMB0(NTIMMAX),S0(NTIMMAX),VARS0(NTIMMAX)  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5957.12:

      REAL*8 LOGT(NTIMMAX),LOGLOGS0(NTIMMAX),SQUANT(NSTIMAX)            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5958.12:

      REAL*8 CUM_RISK,CUM_RIS2,CUM_RSKP,U,UMINUS,W,WMINUS,XFAIL,XCOV,R  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5959.12:

      REAL*8 XSTIME,XL_PREV,SX,SX2,REST(NSTIMAX)                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5960.12:

      REAL*8 BETA(NDIMAX)                                               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:6584.12:

      REAL*8 XJUMP(NTIMMAX),XSTIME                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
d:/Compiler/gcc-4.9.3/mingw_32/bin/gcc -shared -s -static-libgcc -o event.dll tmp.def ksurvb.o ksurvg.o survkit.o -Ld:/Compiler/gcc-4.9.3/local330/lib/i386 -Ld:/Compiler/gcc-4.9.3/local330/lib -lgfortran -lm -lquadmath -LD:/RCompile/recent/R/bin/i386 -lR
installing to d:/RCompile/CRANguest/R-devel/lib/event/libs/i386

*** arch - x64
d:/Compiler/gcc-4.9.3/mingw_64/bin/gcc -m64 -I"D:/RCompile/recent/R/include" -DNDEBUG     -I"d:/Compiler/gcc-4.9.3/local330/include"     -pedantic -O2 -Wall  -std=gnu99 -mtune=core2 -c ksurvb.c -o ksurvb.o
ksurvb.c: In function 'ksurvb':
ksurvb.c:204:49: warning: 'ly' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                 ^
ksurvb.c:178:64: warning: 'h' may be used uninitialized in this function [-Wmaybe-uninitialized]
  *like-=(c>1?lgammafn(a1)-lgammafn(a)-lgammafn(c+1):c*log(a))+c*h;
                                                                ^
ksurvb.c:204:49: warning: 'bt' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                 ^
ksurvb.c:98:13: warning: 'Rf_beta' may be used uninitialized in this function [-Wmaybe-uninitialized]
      else bt+=beta;}
             ^
ksurvb.c:216:14: warning: 'om' may be used uninitialized in this function [-Wmaybe-uninitialized]
  case 1: b=om*(b1-b)+delta; break;
              ^
ksurvb.c:204:48: warning: 'lambda' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                ^
ksurvb.c:158:77: warning: 'intercept' may be used uninitialized in this function [-Wmaybe-uninitialized]
      h=-yy/lambda+(1/(lambda*bt)+1)*log((lambda+intercept)/(lambda+intercept*exp(-bt*yy)));
                                                                             ^
ksurvb.c:181:34: warning: 'family' may be used uninitialized in this function [-Wmaybe-uninitialized]
  if(*pfamily)*like-=(c>0)*(family-c)*log(b1)-a*(pow(b1,family)-pow(b,family))/family;
                                  ^
ksurvb.c:208:12: warning: 'omega' may be used uninitialized in this function [-Wmaybe-uninitialized]
  case 2: om=pow(omega,yy); a=om*a1+(1-om)*delta; break;
            ^
ksurvb.c: In function 'frailb':
ksurvb.c:388:48: warning: 'lambda' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp)));
                                                ^
ksurvb.c:390:4: warning: 'H' may be used uninitialized in this function [-Wmaybe-uninitialized]
  b1+=H;
    ^
ksurvb.c:388:49: warning: 'ly' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp)));
                                                 ^
ksurvb.c:266:17: warning: 'yy' may be used uninitialized in this function [-Wmaybe-uninitialized]
  if(*model>=5)ly=log(yy);
                 ^
ksurvb.c:284:13: warning: 'bt' may be used uninitialized in this function [-Wmaybe-uninitialized]
      bt=exp(log(bt)+exp(p[*nccov+*birth+*tvc+2]*y[nm])*res);
             ^
ksurvb.c:274:13: warning: 'Rf_beta' may be used uninitialized in this function [-Wmaybe-uninitialized]
      else bt+=beta;}
             ^
ksurvb.c:340:61: warning: 'intercept' may be used uninitialized in this function [-Wmaybe-uninitialized]
      l1+=-yy/lambda+log((lambda+intercept)/(lambda+intercept*exp(-bt*yy)))/((lambda*bt)+1);
                                                             ^
d:/Compiler/gcc-4.9.3/mingw_64/bin/gcc -m64 -I"D:/RCompile/recent/R/include" -DNDEBUG     -I"d:/Compiler/gcc-4.9.3/local330/include"     -pedantic -O2 -Wall  -std=gnu99 -mtune=core2 -c ksurvg.c -o ksurvg.o
ksurvg.c: In function 'ksurvg':
ksurvg.c:200:48: warning: 'lambda' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                ^
ksurvg.c:200:49: warning: 'ly' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                 ^
ksurvg.c:168:4: warning: 'l1' may be used uninitialized in this function [-Wmaybe-uninitialized]
  if(l1<1e-20)l1=1e-20;
    ^
ksurvg.c:200:49: warning: 'bt' may be used uninitialized in this function [-Wmaybe-uninitialized]
      case 8: rpred[nm-c+cens[nm]]=exp(bt+lambda*log(2*(ly<bt?tmp:1-tmp))); break;}}}
                                                 ^
ksurvg.c:88:13: warning: 'Rf_beta' may be used uninitialized in this function [-Wmaybe-uninitialized]
      else bt+=beta;}
             ^
ksurvg.c:213:12: warning: 'om' may be used uninitialized in this function [-Wmaybe-uninitialized]
  case 2: b=pow(H,-om)*delta; break;
            ^
ksurvg.c:170:4: warning: 'H' may be used uninitialized in this function [-Wmaybe-uninitialized]
  if(H>1e20)H=1e20;
    ^
ksurvg.c:148:65: warning: 'intercept' may be used uninitialized in this function [-Wmaybe-uninitialized]
      l1=exp(-yy/lambda)*pow((lambda+intercept)/(lambda+intercept*exp(-bt*yy)),1/(lambda*bt)+1);
                                                                 ^
ksurvg.c:204:12: warning: 'omega' may be used uninitialized in this function [-Wmaybe-uninitialized]
  case 2: om=pow(omega,yy); a=om*a1+(1-om)*delta; break;
            ^
d:/Compiler/gcc-4.9.3/mingw_64/bin/gfortran -m64     -pedantic -fbounds-check -O2  -mtune=core2 -c survkit.f -o survkit.o
Warning: Nonconforming tab character in column 1 of line 334
Warning: Nonconforming tab character in column 1 of line 350
Warning: Nonconforming tab character in column 1 of line 567
Warning: Nonconforming tab character in column 1 of line 1194
Warning: Nonconforming tab character in column 1 of line 1509
Warning: Nonconforming tab character in column 1 of line 1732
Warning: Nonconforming tab character in column 1 of line 1735
Warning: Nonconforming tab character in column 1 of line 2025
Warning: Nonconforming tab character in column 1 of line 2217
Warning: Nonconforming tab character in column 1 of line 2454
Warning: Nonconforming tab character in column 1 of line 2456
Warning: Nonconforming tab character in column 1 of line 2479
Warning: Nonconforming tab character in column 1 of line 2480
Warning: Nonconforming tab character in column 1 of line 2490
Warning: Nonconforming tab character in column 1 of line 2510
Warning: Nonconforming tab character in column 1 of line 2517
Warning: Nonconforming tab character in column 1 of line 2518
Warning: Nonconforming tab character in column 6 of line 2519
Warning: Nonconforming tab character in column 1 of line 2520
Warning: Nonconforming tab character in column 1 of line 2523
Warning: Nonconforming tab character in column 5 of line 2526
Warning: Nonconforming tab character in column 1 of line 2527
Warning: Nonconforming tab character in column 1 of line 2532
Warning: Nonconforming tab character in column 1 of line 2537
Warning: Nonconforming tab character in column 1 of line 2543
Warning: Nonconforming tab character in column 1 of line 2572
Warning: Nonconforming tab character in column 1 of line 2577
Warning: Nonconforming tab character in column 1 of line 2582
Warning: Nonconforming tab character in column 6 of line 2587
Warning: Nonconforming tab character in column 1 of line 2589
Warning: Nonconforming tab character in column 1 of line 2590
Warning: Nonconforming tab character in column 6 of line 2591
Warning: Nonconforming tab character in column 1 of line 2592
Warning: Nonconforming tab character in column 1 of line 2597
Warning: Nonconforming tab character in column 1 of line 2603
Warning: Nonconforming tab character in column 1 of line 2725
Warning: Nonconforming tab character in column 1 of line 2733
Warning: Nonconforming tab character in column 1 of line 2737
Warning: Nonconforming tab character in column 1 of line 2738
Warning: Nonconforming tab character in column 1 of line 2739
Warning: Nonconforming tab character in column 1 of line 2740
Warning: Nonconforming tab character in column 1 of line 2742
Warning: Nonconforming tab character in column 1 of line 2743
Warning: Nonconforming tab character in column 1 of line 2745
Warning: Nonconforming tab character in column 1 of line 2849
Warning: Nonconforming tab character in column 5 of line 2889
Warning: Nonconforming tab character in column 1 of line 2892
Warning: Nonconforming tab character in column 1 of line 2906
Warning: Nonconforming tab character in column 5 of line 2938
Warning: Nonconforming tab character in column 1 of line 2939
Warning: Nonconforming tab character in column 1 of line 2941
Warning: Nonconforming tab character in column 1 of line 2966
Warning: Nonconforming tab character in column 1 of line 2979
Warning: Nonconforming tab character in column 5 of line 3010
Warning: Nonconforming tab character in column 1 of line 3059
Warning: Nonconforming tab character in column 1 of line 3066
Warning: Nonconforming tab character in column 3 of line 3079
Warning: Nonconforming tab character in column 1 of line 3091
Warning: Nonconforming tab character in column 1 of line 3093
Warning: Nonconforming tab character in column 1 of line 3094
Warning: Nonconforming tab character in column 1 of line 3095
Warning: Nonconforming tab character in column 3 of line 3098
Warning: Nonconforming tab character in column 1 of line 3100
Warning: Nonconforming tab character in column 1 of line 3195
Warning: Nonconforming tab character in column 1 of line 3196
Warning: Nonconforming tab character in column 1 of line 3203
Warning: Nonconforming tab character in column 1 of line 3232
Warning: Nonconforming tab character in column 1 of line 3416
Warning: Nonconforming tab character in column 1 of line 5215
Warning: Nonconforming tab character in column 1 of line 5216
Warning: Nonconforming tab character in column 1 of line 5217
Warning: Nonconforming tab character in column 1 of line 5218
Warning: Nonconforming tab character in column 1 of line 5458
Warning: Nonconforming tab character in column 1 of line 5459
Warning: Nonconforming tab character in column 1 of line 5460
Warning: Nonconforming tab character in column 1 of line 5461
Warning: Nonconforming tab character in column 1 of line 5463
Warning: Nonconforming tab character in column 1 of line 5464
Warning: Nonconforming tab character in column 1 of line 5687
Warning: Nonconforming tab character in column 1 of line 5904
Warning: Nonconforming tab character in column 1 of line 6616
Warning: Nonconforming tab character in column 1 of line 7811
Warning: Nonconforming tab character in column 1 of line 7812
Warning: Nonconforming tab character in column 1 of line 7851
Warning: Nonconforming tab character in column 1 of line 8629
Warning: Nonconforming tab character in column 1 of line 8759
survkit.f:55.12:

      REAL*8 SQUANT(NQUANT),xtabl(nrr,nccov),xtabl2(nrr2,nccov)         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:56.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA)                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:57.12:

      REAL*8 HESS(NDIMAX,NDIMAX),surv(nstimax*nrr,3)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:72.12:

      REAL*8 F,W,OBJ,LOB,UPB,BEST,DFMIN                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:73.12:

      REAL*8 EPS_BF,DLDET,DLDET0,XLIK(2)                                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:74.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),STORBETA(NDIMAX,0:NPGAUSS)      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:75.12:

      REAL*8 STD(NDIMAX),BOUND(NCCOV+NDCOV,3)                           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:76.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:77.12:

      REAL*8 BETAWOC(2*MXSTRA+3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:78.12:

      REAL*8 WGAUSS(5,5),XGAUSS(5,5),XMOM(0:3),XMOMP(2),W2              
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:79.12:

      REAL*8 OBJ0,XMUK,XMUKM1,SIGK,SIGKM1,R1,R2,VAL0,VAL1,GVAL          
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:80.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:450.12:

      REAL*8 HESS(NDIMAX,NDIMAX),VALRHO(MXSTRA)                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:451.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DIAG(NDIMAX),W(NWORK)           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:452.12:

      REAL*8 STD(NDIMAX),DLDET,OBJ,EPS_BF                               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:453.12:

      REAL*8 F,XTOL,GTOL,STPMIN,STPMAX,BOUND(NCCOV+NDCOV,3)             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:454.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:539.12:

      REAL*8 SUMT,EPS_BF                                                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:540.12:

      REAL*8 BETA(NDIMAX),XGAM(0:NCCOV+NDCOV),BETAWOC(2*MXSTRA+3)       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:541.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA),W1                  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:542.12:

      REAL*8 SQUANT(NQUANT),xtabl(nrr,nccov),xtim                       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:543.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA),xtabl2(nrr2,nccov)          
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:961.12:

      REAL*8 HESS(NDIMAX,NDIMAX),EPS_BF                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:962.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),BOUND(NCCOV+NDCOV,3)            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:963.12:

      REAL*8 FC,OBJ,XC,XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)          
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1019.12:

      REAL*8 GAM0,XNQGAM,OMQGAM,R1GAM,OMEG,EPS_BF,CONST                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1020.12:

      REAL*8 F,U,W,W1,W2,W3,W4,XNS,XNQ,XCOV,X,DM1(7)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1021.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DOMEG(NDIMAX)                   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1022.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1023.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA)                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1024.12:

      REAL*8 RHO,TRHO,TPRERHO,LRHO,DLTIM,DLPRETIM                       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1025.12:

      REAL*8 GAMLOG,DIGAMA,GAMVAR,XNSFIX,BOUND(NCCOV+NDCOV,3)           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1026.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1027.12:

      REAL*8 BETAWOC(2*MXSTRA+3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1599.12:

      REAL*8 HESS(NDIMAX,NDIMAX),D2OMEG(NDIMAX,NDIMAX)                  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1600.12:

      REAL*8 GAM0,CONST,XNQGAM,OMQGAM,R1GAM,R2GAM,R3GAM,OMEG            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1601.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1602.12:

      REAL*8 F,U,W,W1,W2,W3,W4,W5,XNS,XNQ,XCOV,XCOV2,X,DM1(7)           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1603.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DOMEG(NDIMAX),DIAG2OM(NDIMAX)   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1604.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA)                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1605.12:

      REAL*8 RHO,TRHO,TPRERHO,LRHO,DLTIM,DLPRETIM                       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1606.12:

      REAL*8 GAMLOG,DIGAMA,TRIGAM,GAMVAR,XNSFIX                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1607.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1608.12:

      REAL*8 DLDET,WADD,WADD1,WADD2,BOUND(NCCOV+NDCOV,3)                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1609.12:

      REAL*8 STD(NDIMAX),EPS_BF                                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1610.12:

      REAL*8 BETAWOC(2*MXSTRA+3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:1816.38:

                 IF (IGPM.GT.0) THEN                                    
                                      1
Warning: Nonconforming tab character at (1)
survkit.f:2479.12:

      REAL*8 SQUANT(NQUANT),surv(nstimax*nrr,3)                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2480.12:

      REAL*8 CUM_RISK,U,W1,W2,W3,TRHO,XRHO,OMEG,EPS_BF                  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2481.12:

      REAL*8 SX,RHO,XCOV,DLXST,REST(NSTIMAX)                            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2482.12:

      REAL*8 BETA(NDIMAX),TPRERHO,LRHO,DLTIM                            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2483.12:

      REAL*8 BETAWOC(2*MXSTRA+3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2484.12:

      REAL*8 VALRHO(MXSTRA),DLOGRHO(MXSTRA)                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2485.12:

      REAL*8 VECLOG(NTIMMAX),VECEXP(NTIMMAX,MXSTRA)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2664.12:

      REAL*8 X(N),G(N),DIAG(N),W(N*(2*M+1)+2*M)                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2665.12:

      REAL*8 F,EPS,EPS2,XTOL                                            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2841.15:

         REAL*8 GTOL,STPMIN,STPMAX                                      
               1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2884.12:

      REAL*8 ONE,ZERO,GNORM,DDOT,STP1,FTOL,                             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:2898.72:

      GO TO (172,100) IFLAG                                             
                                                                        1
Warning: Obsolescent feature: Computed GOTO at (1)
survkit.f:2909.72:

 30      IF (DIAG(I).LE.ZERO) GO TO 195                                 
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 30 at (1)
survkit.f:2912.72:

 40      DIAG(I)= 1.0D0                                                 
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 40 at (1)
survkit.f:2933.72:

 50   W(ISPT+I)= -G(I)*DIAG(I)                                          
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 50 at (1)
survkit.f:2965.72:

   90    DIAG(I)= YS/YY                                                 
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 90 at (1)
survkit.f:2973.72:

 110    IF (DIAG(I).LE.ZERO) GO TO 195                                  
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 110 at (1)
survkit.f:2985.72:

 112  W(I)= -G(I)                                                       
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 112 at (1)
survkit.f:2998.72:

 130  W(I)=DIAG(I)*W(I)                                                 
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 130 at (1)
survkit.f:3015.72:

 160   W(ISPT+POINT*N+I)= W(I)                                          
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 160 at (1)
survkit.f:3024.72:

 170  W(I)=G(I)                                                         
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 170 at (1)
survkit.f:3041.72:

 175  W(IYPT+NPT+I)= G(I)-W(I)                                          
                                                                        1
Warning: Obsolescent feature: DO termination statement which is not END DO or CONTINUE with label 175 at (1)
survkit.f:3085.12:

      REAL*8 GTOL,STPMIN,STPMAX                                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3103.12:

      REAL*8 dx(n),dy(n),da,zero                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3208.12:

      REAL*8 F,STP,FTOL,GTOL,XTOL,STPMIN,STPMAX                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3209.12:

      REAL*8 X(N),G(N),S(N),WA(N)                                       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3335.12:

      REAL*8 DG,DGM,DGINIT,DGTEST,DGX,DGXM,DGY,DGYM,                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3513.12:

      REAL*8 STX,FX,DX,STY,FY,DY,STP,FP,DP,STPMIN,STPMAX                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3572.12:

      REAL*8 GAMMA,P,Q,R,S,SGND,STPC,STPF,STPQ,THETA,ZERO               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3745.12:

      REAL*8 AX,BX,TOL,OBJ                                              
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3805.12:

      REAL*8 HESS(NDIMAX,NDIMAX),BOUND(NCCOV+NDCOV,3)                   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3806.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3807.12:

      REAL*8 A,B,C,D,E,EPS,XM,P,Q,R,TOL1,TOL2,U,V,W                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3808.12:

      REAL*8 FU,FV,FW,FX,X,BETA(NDIMAX)                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:3809.12:

      REAL*8 DABS,DSQRT,DSIGN                                           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4081.12:

      REAL*8 X(NDIMAX),Y(NDIMAX),T,AMED,HOLD                            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4188.12:

      REAL*8 FUNCTION GAMLOG(XVALUE)                                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4195.12:

      REAL*8 ALR2PI, FOUR, HALF, ONE, ONEP5, R1(9), R2(9),              
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4293.12:

      REAL*8 DIGAMA,ZERO, HALF, ONE                                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4294.12:

      REAL*8 R,S,C,S3,S4,S5,D1,Y,X                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4337.12:

      real*8 trigam,a, b, one, half, b2, b4, b6,b8, x, y, z, zero       
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4409.12:

      REAL*8 TOL                                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4413.12:

      REAL*8  A(LDA,*),DDOT,T,S                                         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4646.12:

      REAL*8 F,W,OBJ,LOB,UPB,BEST,DFMIN                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4647.12:

      REAL*8 DLDET,XCOEF(MXEF),EPS_BF                                   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4648.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX)                                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4649.12:

      REAL*8 XLIK(2),BOUND(NCCOV+NDCOV,3)                               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4650.12:

      REAL*8 STD(NDIMAX),STORBETA(NDIMAX,0:NPGAUSS)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4651.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4652.12:

      REAL*8 WGAUSS(5,5),XGAUSS(5,5),XMOM(0:3),XMOMP(2),W2              
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4653.12:

      REAL*8 OBJ0,XMUK,XMUKM1,SIGK,SIGKM1,R1,R2,VAL0,VAL1,GVAL          
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4654.12:

      REAL*8 SQUANT(NQUANT),xtabl(nrr,nccov),xtabl2(nrr2,nccov)         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4655.12:

      REAL*8 HESS(NDIMAX,NDIMAX),valrho(MXSTRA),km(ut,4),resid(ut,3)    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4656.12:

      real*8 surv(nstimax*nrr,3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4954.12:

      REAL*8 CONST                                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4966.12:

      REAL*8 CUM_RISK,F,U,UMINUS,W,WMINUS,XFAIL,XCOV,R,X,DM1(7)         
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4967.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DC_RISK(NDIMAX)                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4968.12:

      REAL*8 GAMLOG,XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)             
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:4969.12:

      REAL*8 XCOEF(MXEF),BOUND(NCCOV+NDCOV,3)                           
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5327.12:

      REAL*8 CONST                                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5339.12:

      REAL*8 XCOEF(MXEF)                                                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5340.12:

      REAL*8 CUM_RISK,F,U,UMINUS,W,WMINUS,XFAIL,XCOV,XCOV2,R,X,DM1(7)   
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5341.12:

      REAL*8 DLDET                                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5342.12:

      REAL*8 BETA(NDIMAX),GRADF(NDIMAX),DC_RISK(NDIMAX)                 
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5343.12:

      REAL*8 GAMLOG,HESS(NDIMAX,NDIMAX),STD(NDIMAX)                     
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5345.12:

      REAL*8 D2C_RISK(NDIMAX,NDIMAX),BOUND(NCCOV+NDCOV,3)               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5346.12:

      REAL*8 XGAM(0:NCCOV+NDCOV),XNOR(0:NCCOV+NDCOV)                    
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5949.12:

      REAL*8 km(ut,4),resid(ut,3),xic,xmart,xdev                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5953.12:

      real*8 surv(nstimax*nrr,3)                                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5955.12:

      REAL*8 XCOEF(MXEF)                                                
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5956.12:

      REAL*8 XJUMP(NTIMMAX),XLAMB0(NTIMMAX),S0(NTIMMAX),VARS0(NTIMMAX)  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5957.12:

      REAL*8 LOGT(NTIMMAX),LOGLOGS0(NTIMMAX),SQUANT(NSTIMAX)            
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5958.12:

      REAL*8 CUM_RISK,CUM_RIS2,CUM_RSKP,U,UMINUS,W,WMINUS,XFAIL,XCOV,R  
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5959.12:

      REAL*8 XSTIME,XL_PREV,SX,SX2,REST(NSTIMAX)                        
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:5960.12:

      REAL*8 BETA(NDIMAX)                                               
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
survkit.f:6584.12:

      REAL*8 XJUMP(NTIMMAX),XSTIME                                      
            1
Warning: GNU Extension: Nonstandard type declaration REAL*8 at (1)
d:/Compiler/gcc-4.9.3/mingw_64/bin/gcc -m64 -shared -s -static-libgcc -o event.dll tmp.def ksurvb.o ksurvg.o survkit.o -Ld:/Compiler/gcc-4.9.3/local330/lib/x64 -Ld:/Compiler/gcc-4.9.3/local330/lib -lgfortran -lm -lquadmath -LD:/RCompile/recent/R/bin/x64 -lR
installing to d:/RCompile/CRANguest/R-devel/lib/event/libs/x64
** R
** preparing package for lazy loading
** help
*** installing help indices
** building package indices
** testing if installed package can be loaded
*** arch - i386
*** arch - x64
* MD5 sums
packaged installation of 'event' as event_1.1.0.zip
* DONE (event)
swihart commented 7 years ago

So we have the warning above, here's the two errors (same one, each for 32 and 64 bit):

<snip>
> # estimate a log-gamma random effect by integrating it out
> survkit(y, censor=cens, ccov=~x, dist="loggamma", estimate=1.3,
+   integ=id, jointmode=TRUE)
At line 894 of file survkit.f
Fortran runtime error: Index '2' of dimension 1 of array 'xgam' above upper bound of 1
** running examples for arch 'x64' ... ERROR

Lines 889-894 of survkit.f:

C-----------------------------------------------------------------------
C  STARTING VALUES FOR BETA(NDIM) IF COMPUTATION OF A GAMMA PARAMETER
C AS A JOINT MODE AFTER ALGEBRAIC INTEGRATION
C-----------------------------------------------------------------------  
       IF (NJOINT.EQ.1)
     +  BETA(NDIM)= DLOG(XGAM(INTEGAM))
swihart commented 7 years ago

Test:

as per http://stackoverflow.com/a/28855438/2727349. Re-run local CMD-SFT-E. Results:

ERROR, can't install. So, undo that.

* checking whether package ‘event’ can be installed ... ERROR
Installation failed.
See ‘/Users/swihartbj/github/event.Rcheck/00install.out’ for details.
* DONE
swihart commented 7 years ago

Okay, might be problem with jointmode or loggamma. Do this in survkit.Rd lines 123-126:

\dontrun{
survkit(y, censor=cens, ccov=~x, dist="loggamma", estimate=1.3,
    integ=id, jointmode=TRUE)
    }

re-check locally. Results:

R CMD check results
0 errors | 0 warnings | 0 notes

R CMD check succeeded

Of course locally was fine. Submit to winbuilder and see if that's enough for now to silence the errors. ...wait 10 minutes... it was not. And it appears to be anything involving "loggamma":

> # estimate a log-gamma random effect by integrating it out
> ## Not run: 
> ##D survkit(y, censor=cens, ccov=~x, dist="loggamma", estimate=1.3,
> ##D   integ=id, jointmode=TRUE)
> ##D   
> ## End(Not run)
> # try a fixed value of the log-gamma random effect, integrating it out
> survkit(y, censor=cens, ccov=~x, dist="loggamma", estimate=1,
+   integ=id)
At line 1060 of file survkit.f
Fortran runtime error: Index '2' of dimension 1 of array 'xgam' above upper bound of 1
* checking PDF version of manual ... OK
* DONE
Status: 2 ERRORs, 1 WARNING, 1 NOTE

So I will put dontrun on everything with loggamma and resubmit.

Looking at it more closely, I think it has to do with "loggamma" and estimate being a scalar, because the loggamma above dontrun has length(estimate) = 3 and is fine. We don't run the 2nd and 3rd loggamma and resubmit to win builder:

# estimate a log-gamma random effect
survkit(y, censor=cens, ccov=~x, random=id, dist="loggamma",
    estimate=c(0.1,10,0.01))
# estimate a log-gamma random effect by integrating it out
\dontrun{
survkit(y, censor=cens, ccov=~x, dist="loggamma", estimate=1.3,
    integ=id, jointmode=TRUE)
# try a fixed value of the log-gamma random effect, integrating it out
survkit(y, censor=cens, ccov=~x, dist="loggamma", estimate=1,
    integ=id)
    }

winbuilder results:

Status: 1 WARNING, 1 NOTE

Good. Now, open another issue about the loggamma/estimate(scalar) issue and handle later. Now on to the Fortran warning.

swihart commented 7 years ago

Taking a note from https://gcc.gnu.org/bugzilla/show_bug.cgi?id=41102, I replace all 112 instances real*8 with real(8) in survkit.f and do a local re-check:

* DONE
Status: OK

R CMD check results
0 errors | 0 warnings | 0 notes

R CMD check succeeded

and a winbuilder recheck:

Status: 1 NOTE

That's how we do. Travis CI also says we're good to go!