* installing *source* package ‘spant’ ...
** package ‘spant’ successfully unpacked and MD5 sums checked
** using staged installation
** libs
using C compiler: ‘clang version 18.1.2’
using Fortran compiler: ‘flang-new version 18.1.2’
make[1]: Entering directory '/data/gannet/ripley/R/packages/tests-clang/spant/src'
/usr/local/clang18/bin/clang -I"/data/gannet/ripley/R/R-clang/include" -DNDEBUG   -isystem /usr/local/clang18/include -I/usr/local/clang/include    -fpic  -O3 -Wall -pedantic -Wp,-D_FORTIFY_SOURCE=3  -c init.c -o init.o
/usr/local/clang18/bin/flang-new  -fpic  -O2 -pedantic  -c lsei.f -o lsei.o
./lsei.f:308:7: portability: deprecated usage
        IF (ANOISE) 10,30,20  
        ^^^^^^^^^^^^^^^^^^^^
./lsei.f:308:7: in the context: arithmetic IF statement
        IF (ANOISE) 10,30,20  
        ^
./lsei.f:308:7: in the context: execution part construct
        IF (ANOISE) 10,30,20  
        ^
./lsei.f:308:7: in the context: execution part
        IF (ANOISE) 10,30,20  
        ^
./lsei.f:293:7: in the context: FUNCTION subprogram
              double precision FUNCTION   GEN(ANOISE)
        ^
./lsei.f:386:7: portability: deprecated usage
        IF (CL) 130,130,20
        ^^^^^^^^^^^^^^^^^^
./lsei.f:386:7: in the context: arithmetic IF statement
        IF (CL) 130,130,20
        ^
./lsei.f:386:7: in the context: execution part construct
        IF (CL) 130,130,20
        ^
./lsei.f:380:7: in the context: execution part
        IF (0.GE.LPIVOT.OR.LPIVOT.GE.L1.OR.L1.GT.M) RETURN    
        ^
./lsei.f:370:7: in the context: SUBROUTINE subprogram
        SUBROUTINE H12 (MODE,LPIVOT,L1,M,U,IUE,UP,C,ICE,ICV,NCV)  
        ^
./lsei.f:392:7: portability: deprecated usage
        IF (U(1,LPIVOT)) 50,50,40     
        ^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:392:7: in the context: arithmetic IF statement
        IF (U(1,LPIVOT)) 50,50,40     
        ^
./lsei.f:392:7: in the context: execution part construct
        IF (U(1,LPIVOT)) 50,50,40     
        ^
./lsei.f:380:7: in the context: execution part
        IF (0.GE.LPIVOT.OR.LPIVOT.GE.L1.OR.L1.GT.M) RETURN    
        ^
./lsei.f:370:7: in the context: SUBROUTINE subprogram
        SUBROUTINE H12 (MODE,LPIVOT,L1,M,U,IUE,UP,C,ICE,ICV,NCV)  
        ^
./lsei.f:399:7: portability: deprecated usage
     60 IF (CL) 130,130,70
        ^^^^^^^^^^^^^^^^^^
./lsei.f:399:7: in the context: arithmetic IF statement
     60 IF (CL) 130,130,70
        ^
./lsei.f:399:4: in the context: execution part construct
     60 IF (CL) 130,130,70
     ^
./lsei.f:380:7: in the context: execution part
        IF (0.GE.LPIVOT.OR.LPIVOT.GE.L1.OR.L1.GT.M) RETURN    
        ^
./lsei.f:370:7: in the context: SUBROUTINE subprogram
        SUBROUTINE H12 (MODE,LPIVOT,L1,M,U,IUE,UP,C,ICE,ICV,NCV)  
        ^
./lsei.f:404:7: portability: deprecated usage
        IF (B) 80,130,130 
        ^^^^^^^^^^^^^^^^^
./lsei.f:404:7: in the context: arithmetic IF statement
        IF (B) 80,130,130 
        ^
./lsei.f:404:7: in the context: execution part construct
        IF (B) 80,130,130 
        ^
./lsei.f:380:7: in the context: execution part
        IF (0.GE.LPIVOT.OR.LPIVOT.GE.L1.OR.L1.GT.M) RETURN    
        ^
./lsei.f:370:7: in the context: SUBROUTINE subprogram
        SUBROUTINE H12 (MODE,LPIVOT,L1,M,U,IUE,UP,C,ICE,ICV,NCV)  
        ^
./lsei.f:416:11: portability: deprecated usage
            IF (SM) 100,120,100   
            ^^^^^^^^^^^^^^^^^^^
./lsei.f:416:11: in the context: arithmetic IF statement
            IF (SM) 100,120,100   
            ^
./lsei.f:416:7: in the context: execution part construct
            IF (SM) 100,120,100   
        ^
./lsei.f:380:7: in the context: execution part
        IF (0.GE.LPIVOT.OR.LPIVOT.GE.L1.OR.L1.GT.M) RETURN    
        ^
./lsei.f:370:7: in the context: SUBROUTINE subprogram
        SUBROUTINE H12 (MODE,LPIVOT,L1,M,U,IUE,UP,C,ICE,ICV,NCV)  
        ^
./lsei.f:460:11: portability: deprecated usage
            IF(DIFF(HMAX+FACTOR*H(LMAX),HMAX)) 20,20,50   
            ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:460:11: in the context: arithmetic IF statement
            IF(DIFF(HMAX+FACTOR*H(LMAX),HMAX)) 20,20,50   
            ^
./lsei.f:460:7: in the context: execution part construct
            IF(DIFF(HMAX+FACTOR*H(LMAX),HMAX)) 20,20,50   
        ^
./lsei.f:447:7: in the context: execution part
        K=0   
        ^
./lsei.f:426:7: in the context: SUBROUTINE subprogram
        SUBROUTINE HFTI (A,MDA,M,N,B,MDB,NB,TAU,KRANK,RNORM,H,G,IP)   
        ^
./lsei.f:629:7: portability: deprecated usage
        IF (RNORM) 130,130,50 
        ^^^^^^^^^^^^^^^^^^^^^
./lsei.f:629:7: in the context: arithmetic IF statement
        IF (RNORM) 130,130,50 
        ^
./lsei.f:629:7: in the context: execution part construct
        IF (RNORM) 130,130,50 
        ^
./lsei.f:590:7: in the context: execution part
        IF (N.LE.0) GO TO 120 
        ^
./lsei.f:572:7: in the context: SUBROUTINE subprogram
        SUBROUTINE LDP (G,MDG,M,N,H,X,XNORM,W,INDEX,MODE)     
        ^
./lsei.f:637:7: portability: deprecated usage
        IF (DIFF(ONE+FAC,ONE)) 130,130,70 
        ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:637:7: in the context: arithmetic IF statement
        IF (DIFF(ONE+FAC,ONE)) 130,130,70 
        ^
./lsei.f:637:7: in the context: execution part construct
        IF (DIFF(ONE+FAC,ONE)) 130,130,70 
        ^
./lsei.f:590:7: in the context: execution part
        IF (N.LE.0) GO TO 120 
        ^
./lsei.f:572:7: in the context: SUBROUTINE subprogram
        SUBROUTINE LDP (G,MDG,M,N,H,X,XNORM,W,INDEX,MODE)     
        ^
./lsei.f:2062:7: portability: deprecated usage
        IF (A(I,I)) 90,70,90  
        ^^^^^^^^^^^^^^^^^^^^
./lsei.f:2062:7: in the context: arithmetic IF statement
        IF (A(I,I)) 90,70,90  
        ^
./lsei.f:2062:7: in the context: execution part construct
        IF (A(I,I)) 90,70,90  
        ^
./lsei.f:2034:7: in the context: execution part
        N=N1  
        ^
./lsei.f:2022:7: in the context: SUBROUTINE subprogram
        subroutine SVDRS (A, MDA, M1, N1, B, MDB, NB, S, WORK) 
        ^
./lsei.f:2064:11: portability: deprecated usage
            IF (A(I,J)) 90,80,90  
            ^^^^^^^^^^^^^^^^^^^^
./lsei.f:2064:11: in the context: arithmetic IF statement
            IF (A(I,J)) 90,80,90  
            ^
./lsei.f:2064:7: in the context: execution part construct
            IF (A(I,J)) 90,80,90  
        ^
./lsei.f:2034:7: in the context: execution part
        N=N1  
        ^
./lsei.f:2022:7: in the context: SUBROUTINE subprogram
        subroutine SVDRS (A, MDA, M1, N1, B, MDB, NB, S, WORK) 
        ^
./lsei.f:82:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 10 I=1,MT  
        ^^^^^^^^^^^^
./lsei.f:86:4: DO loop currently ends at statement:
     10   G(IG1,J)=G(IG2,J)   
     ^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:85:9: portability: A DO loop should terminate with an END DO or CONTINUE
          DO 10 J=1,NBP1  
          ^^^^^^^^^^^^^^
./lsei.f:86:4: DO loop currently ends at statement:
     10   G(IG1,J)=G(IG2,J)   
     ^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:89:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 20 I=1,IE  
        ^^^^^^^^^^^^
./lsei.f:92:4: DO loop currently ends at statement:
     20   G(IG,J)=ZERO    
     ^^^^^^^^^^^^^^^^^
./lsei.f:91:9: portability: A DO loop should terminate with an END DO or CONTINUE
          DO 20 J=1,NBP1  
          ^^^^^^^^^^^^^^
./lsei.f:92:4: DO loop currently ends at statement:
     20   G(IG,J)=ZERO    
     ^^^^^^^^^^^^^^^^^
./lsei.f:99:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 50 L=1,MU  
        ^^^^^^^^^^^^
./lsei.f:111:4: DO loop currently ends at statement:
     50   G(IG,JG)=ZERO   
     ^^^^^^^^^^^^^^^^^^
./lsei.f:105:9: portability: A DO loop should terminate with an END DO or CONTINUE
          DO 40 I=LP1,NB  
          ^^^^^^^^^^^^^^
./lsei.f:107:4: DO loop currently ends at statement:
     40     G(IG,JG)=G(IG,I)  
     ^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:109:9: portability: A DO loop should terminate with an END DO or CONTINUE
          DO 50 I=1,K     
          ^^^^^^^^^^^
./lsei.f:111:4: DO loop currently ends at statement:
     50   G(IG,JG)=ZERO   
     ^^^^^^^^^^^^^^^^^^
./lsei.f:127:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 90 I=1,NB  
        ^^^^^^^^^^^^
./lsei.f:128:4: DO loop currently ends at statement:
     90   G(IR-1,I)=ZERO  
     ^^^^^^^^^^^^^^^^^^^
./lsei.f:165:4: portability: A DO loop should terminate with an END DO or CONTINUE
     10      DO 20 J=1,N  
     ^^^^^^^^^^^^^^^^^^^
./lsei.f:166:4: DO loop currently ends at statement:
     20      X(J)=G(J,NB+1)   
     ^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:171:12: portability: A DO loop should terminate with an END DO or CONTINUE
             DO 30 J=NP1,IRM1 
             ^^^^^^^^^^^^^^^^
./lsei.f:172:4: DO loop currently ends at statement:
     30      RSQ=RSQ+G(J,NB+1)**2     
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:177:4: portability: A DO loop should terminate with an END DO or CONTINUE
     50      DO 80 II=1,N 
     ^^^^^^^^^^^^^^^^^^^^
./lsei.f:193:4: DO loop currently ends at statement:
     80      X(I)=(X(I)-S)/G(I,L+1)   
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:186:17: portability: A DO loop should terminate with an END DO or CONTINUE
                  DO 60 J=2,IE
                  ^^^^^^^^^^^^
./lsei.f:189:4: DO loop currently ends at statement:
     60           S=S+G(I,JG)*X(IX)   
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:197:4: portability: A DO loop should terminate with an END DO or CONTINUE
     90      DO 120 J=1,N 
     ^^^^^^^^^^^^^^^^^^^^
./lsei.f:207:3: DO loop currently ends at statement:
    120      X(J)=(X(J)-S)/G(J,L+1)   
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:202:17: portability: A DO loop should terminate with an END DO or CONTINUE
                  DO 100 I=I1,I2  
                  ^^^^^^^^^^^^^^
./lsei.f:204:3: DO loop currently ends at statement:
    100           S=S+X(I)*G(I,L)     
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:384:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 10 J=L1,M  
            ^^^^^^^^^^^^
./lsei.f:385:4: DO loop currently ends at statement:
     10     CL=MAX(abs(U(1,J)),CL)  
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:389:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 30 J=L1,M  
            ^^^^^^^^^^^^
./lsei.f:390:4: DO loop currently ends at statement:
     30     SM=SM+(U(1,J)*CLINV)**2 
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:413:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 90 I=L1,M  
                ^^^^^^^^^^^^
./lsei.f:415:4: DO loop currently ends at statement:
     90         I3=I3+ICE 
     ^^^^^^^^^^^^^^^^^^^^
./lsei.f:419:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 110 I=L1,M 
                ^^^^^^^^^^^^^
./lsei.f:421:3: DO loop currently ends at statement:
    110         I4=I4+ICE 
    ^^^^^^^^^^^^^^^^^^^^^
./lsei.f:450:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 80 J=1,LDIAG   
            ^^^^^^^^^^^^^^^
./lsei.f:489:4: DO loop currently ends at statement:
     80     CALL H12 (2,J,J+1,M,A(1,J),1,H(J),B,1,MDB,NB)     
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:467:19: portability: A DO loop should terminate with an END DO or CONTINUE
                    DO 30 I=J,M   
                    ^^^^^^^^^^^
./lsei.f:468:4: DO loop currently ends at statement:
     30             H(L)=H(L)+A(I,L)**2   
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:480:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 60 I=1,M   
                ^^^^^^^^^^^
./lsei.f:483:4: DO loop currently ends at statement:
     60         A(I,LMAX)=TMP 
     ^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:504:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 130 JB=1,NB
            ^^^^^^^^^^^^^^
./lsei.f:509:3: DO loop currently ends at statement:
    130     RNORM(JB)=SQRT(TMP)   
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:507:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 120 I=KP1,M
                ^^^^^^^^^^^^^^
./lsei.f:508:3: DO loop currently ends at statement:
    120         TMP=TMP+B(I,JB)**2    
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:514:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 150 JB=1,NB
            ^^^^^^^^^^^^^^
./lsei.f:516:3: DO loop currently ends at statement:
    150         B(I,JB)=ZERO 
    ^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:515:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 150 I=1,N  
                ^^^^^^^^^^^^
./lsei.f:516:3: DO loop currently ends at statement:
    150         B(I,JB)=ZERO 
    ^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:523:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 170 II=1,K 
            ^^^^^^^^^^^^^
./lsei.f:525:3: DO loop currently ends at statement:
    170     CALL H12 (1,I,KP1,N,A(I,1),MDA,G(I),A,MDA,1,I-1)  
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:534:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 210 L=1,K  
                ^^^^^^^^^^^^
./lsei.f:542:3: DO loop currently ends at statement:
    210         B(I,JB)=(B(I,JB)-SM)/A(I,I)  
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:539:19: portability: A DO loop should terminate with an END DO or CONTINUE
                    DO 190 J=IP1,K    
                    ^^^^^^^^^^^^^^
./lsei.f:540:3: DO loop currently ends at statement:
    190             SM=SM+A(I,J)*B(J,JB)
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:547:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 220 J=KP1,N
                ^^^^^^^^^^^^^^
./lsei.f:548:3: DO loop currently ends at statement:
    220         B(J,JB)=ZERO 
    ^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:549:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 230 I=1,K  
                ^^^^^^^^^^^^
./lsei.f:550:3: DO loop currently ends at statement:
    230         CALL H12 (2,I,KP1,N,A(I,1),MDA,G(I),B(1,JB),1,MDB,1)  
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:591:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 10 J=1,N   
            ^^^^^^^^^^^
./lsei.f:592:4: DO loop currently ends at statement:
     10     X(J)=ZERO     
     ^^^^^^^^^^^^^^^^
./lsei.f:607:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 30 J=1,M   
            ^^^^^^^^^^^
./lsei.f:612:4: DO loop currently ends at statement:
     30     W(IW)=H(J)    
     ^^^^^^^^^^^^^^^^^
./lsei.f:608:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 20 I=1,N   
                ^^^^^^^^^^^
./lsei.f:610:4: DO loop currently ends at statement:
     20         W(IW)=G(J,I)  
     ^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:615:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 40 I=1,N   
            ^^^^^^^^^^^
./lsei.f:617:4: DO loop currently ends at statement:
     40     W(IW)=ZERO    
     ^^^^^^^^^^^^^^^^^
./lsei.f:632:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 60 I=1,M   
            ^^^^^^^^^^^
./lsei.f:635:4: DO loop currently ends at statement:
     60     FAC=FAC-H(I)*W(IW)
     ^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:639:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 90 J=1,N   
            ^^^^^^^^^^^
./lsei.f:645:4: DO loop currently ends at statement:
     90     X(J)=X(J)*FAC 
     ^^^^^^^^^^^^^^^^^^^^
./lsei.f:641:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 80 I=1,M   
                ^^^^^^^^^^^
./lsei.f:644:4: DO loop currently ends at statement:
     80         X(J)=X(J)+G(I,J)*W(IW)
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:646:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 100 J=1,N  
            ^^^^^^^^^^^^
./lsei.f:647:3: DO loop currently ends at statement:
    100     XNORM=XNORM+X(J)**2   
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:874:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 20 I=1,N   
            ^^^^^^^^^^^
./lsei.f:876:4: DO loop currently ends at statement:
     20     INDEX(I)=I    
     ^^^^^^^^^^^^^^^^^
./lsei.f:894:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 40 L=NPP1,M
           ^^^^^^^^^^^^^^
./lsei.f:895:4: DO loop currently ends at statement:
     40        SM=SM+A(L,J)*B(L)     
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:924:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 90 L=1,NSETP   
            ^^^^^^^^^^^^^^^
./lsei.f:925:4: DO loop currently ends at statement:
     90       UNORM=UNORM+A(L,J)**2     
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:933:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 120 L=1,M  
           ^^^^^^^^^^^^
./lsei.f:934:3: DO loop currently ends at statement:
    120        ZZ(L)=B(L)    
    ^^^^^^^^^^^^^^^^^^^^^
./lsei.f:957:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 150 L=1,M  
        ^^^^^^^^^^^^
./lsei.f:958:3: DO loop currently ends at statement:
    150    B(L)=ZZ(L)    
    ^^^^^^^^^^^^^^^^^
./lsei.f:974:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 180 L=NPP1,M   
           ^^^^^^^^^^^^^^^
./lsei.f:975:3: DO loop currently ends at statement:
    180       A(L,J)=ZERO   
    ^^^^^^^^^^^^^^^^^^^^^
./lsei.f:1077:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 310 I=1,M  
        ^^^^^^^^^^^^
./lsei.f:1078:3: DO loop currently ends at statement:
    310     ZZ(I)=B(I)    
    ^^^^^^^^^^^^^^^^^^
./lsei.f:1086:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 340 IP=1,NSETP 
        ^^^^^^^^^^^^^^^^^
./lsei.f:1088:3: DO loop currently ends at statement:
    340     X(I)=ZZ(IP)   
    ^^^^^^^^^^^^^^^^^^^
./lsei.f:1100:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 360 I=NPP1,M   
           ^^^^^^^^^^^^^^^
./lsei.f:1101:3: DO loop currently ends at statement:
    360       SM=SM+B(I)**2 
    ^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:1103:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 380 J=1,N  
           ^^^^^^^^^^^^
./lsei.f:1104:3: DO loop currently ends at statement:
    380       W(J)=ZERO     
    ^^^^^^^^^^^^^^^^^^^
./lsei.f:1191:12: portability: A DO loop should terminate with an END DO or CONTINUE
             DO 10 J=1,N  
             ^^^^^^^^^^^
./lsei.f:1192:4: DO loop currently ends at statement:
     10      DNORM=max(abs(Q(J))+abs(E(J)),DNORM)   
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:1350:17: portability: A DO loop should terminate with an END DO or CONTINUE
                  DO 180 J=1,NRV  
                  ^^^^^^^^^^^^^^
./lsei.f:1351:3: DO loop currently ends at statement:
    180           V(J,K)=-V(J,K)  
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:1377:17: portability: A DO loop should terminate with an END DO or CONTINUE
                  DO 240 J=1,NCC  
                  ^^^^^^^^^^^^^^
./lsei.f:1380:3: DO loop currently ends at statement:
    240           C(K,J)=T
    ^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:1384:17: portability: A DO loop should terminate with an END DO or CONTINUE
                  DO 260 J=1,NRV  
                  ^^^^^^^^^^^^^^
./lsei.f:1387:3: DO loop currently ends at statement:
    260           V(J,K)=T
    ^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:1633:16: portability: A DO loop should terminate with an END DO or CONTINUE
                 DO 30 I = 1,M
                 ^^^^^^^^^^^^^
./lsei.f:1634:4: DO loop currently ends at statement:
     30             SB = SB + A(I,J)**2
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:1896:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 210 I = 1,N
           ^^^^^^^^^^^^^^
./lsei.f:1898:3: DO loop currently ends at statement:
    210           IF (K.GT.1) A(I,K) = A(I,K) + A(I,K-1)
    ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:2045:13: portability: A DO loop should terminate with an END DO or CONTINUE
              DO 30 I=1,M1  
              ^^^^^^^^^^^^
./lsei.f:2046:4: DO loop currently ends at statement:
     30       A(I,J)=A(I,N) 
     ^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:2072:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 110 J=1,NB 
            ^^^^^^^^^^^^^
./lsei.f:2075:3: DO loop currently ends at statement:
    110     B(M,J)=T  
    ^^^^^^^^^^^^^^^^
./lsei.f:2076:3: portability: A DO loop should terminate with an END DO or CONTINUE
    115     DO 120 J=1,N  
    ^^^^^^^^^^^^^^^^^^^^
./lsei.f:2077:3: DO loop currently ends at statement:
    120     A(I,J)=A(M,J) 
    ^^^^^^^^^^^^^^^^^^^^^
./lsei.f:2079:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 130 J=1,N  
            ^^^^^^^^^^^^
./lsei.f:2080:3: DO loop currently ends at statement:
    130     A(M,J)=ZERO   
    ^^^^^^^^^^^^^^^^^^^
./lsei.f:2127:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 180 J=2,L  
            ^^^^^^^^^^^^
./lsei.f:2129:3: DO loop currently ends at statement:
    180     WORK(J,1)=A(J-1,J)   
    ^^^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:2142:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 230 K=1,N  
            ^^^^^^^^^^^^
./lsei.f:2148:3: DO loop currently ends at statement:
    230     A(I,I)=ONE    
    ^^^^^^^^^^^^^^^^^^
./lsei.f:2146:3: portability: A DO loop should terminate with an END DO or CONTINUE
    210         DO 220 J=1,N  
    ^^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:2147:3: DO loop currently ends at statement:
    220         A(I,J)=ZERO   
    ^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:2163:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 250 J=NSP1,N   
            ^^^^^^^^^^^^^^^
./lsei.f:2164:3: DO loop currently ends at statement:
    250     S(J)=ZERO   
    ^^^^^^^^^^^^^^^^^
./lsei.f:2172:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 270 I=1,N  
                ^^^^^^^^^^^^
./lsei.f:2173:3: DO loop currently ends at statement:
    270         A(I,J)=ZERO   
    ^^^^^^^^^^^^^^^^^^^^^^^
./lsei.f:2179:15: portability: A DO loop should terminate with an END DO or CONTINUE
                DO 290 J=1,N1 
                ^^^^^^^^^^^^^
./lsei.f:2181:3: DO loop currently ends at statement:
    290         A(I,J)=ZERO   
    ^^^^^^^^^^^^^^^^^^^^^^^
/usr/local/clang18/bin/flang-new  -fpic  -O2 -pedantic  -c pnnls.f -o pnnls.o
./pnnls.f:88:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 20 I=1,N   
        ^^^^^^^^^^^
./pnnls.f:90:4: DO loop currently ends at statement:
     20 INDEX(I)=I    
     ^^^^^^^^^^^^^
./pnnls.f:113:13: portability: A DO loop should terminate with an END DO or CONTINUE
              DO 510 L=1,NK
              ^^^^^^^^^^^^^
./pnnls.f:114:2: DO loop currently ends at statement:
   510           UNORM=UNORM+A(L,J)**2     
   ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:118:13: warning: Reference to the procedure 'h12' has an implicit interface that is distinct from another reference: incompatible dummy argument #8: incompatible dummy data object shapes
              CALL H12 (2,NK+1,NK+2,M,A(1,J),1,UP,B,1,1,1)
              ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:110:10: previous reference to 'h12'
           CALL H12 (1,NK+1,NK+2,M,A(1,J),1,UP,DUMMY,1,1,0)    
           ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:122:16: warning: Reference to the procedure 'h12' has an implicit interface that is distinct from another reference: incompatible dummy argument #8: incompatible dummy data object shapes
                 CALL H12 (2,NK,NK+1,M,A(1,J),1,UP,A(1,JJ),1,MDA,1)
                 ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:110:10: previous reference to 'h12'
           CALL H12 (1,NK+1,NK+2,M,A(1,J),1,UP,DUMMY,1,1,0)    
           ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:125:16: portability: A DO loop should terminate with an END DO or CONTINUE
                 DO 530 L=NK+1,M   
                 ^^^^^^^^^^^^^^^
./pnnls.f:126:2: DO loop currently ends at statement:
   530              A(L,J)=ZERO   
   ^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:131:16: portability: A DO loop should terminate with an END DO or CONTINUE
                 do 540 IK=NK+1,IZ1-2
                 ^^^^^^^^^^^^^^^^^^^^
./pnnls.f:132:2: DO loop currently ends at statement:
   540              INDEX(IK) = INDEX(IK+1)
   ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:135:16: portability: A DO loop should terminate with an END DO or CONTINUE
                 do 550 IK=IZ1,IZ2
                 ^^^^^^^^^^^^^^^^^
./pnnls.f:136:2: DO loop currently ends at statement:
   550              INDEX(IK-1) = INDEX(IK)
   ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:147:7: portability: A DO loop should terminate with an END DO or CONTINUE
        do 570 IP=1,NK
        ^^^^^^^^^^^^^^
./pnnls.f:148:2: DO loop currently ends at statement:
   570     ZZ(IP)=B(IP)
   ^^^^^^^^^^^^^^^^^^^^
./pnnls.f:151:7: portability: A DO loop should terminate with an END DO or CONTINUE
        do 590 IP=1,NK
        ^^^^^^^^^^^^^^
./pnnls.f:153:2: DO loop currently ends at statement:
   590     X(L)=ZZ(IP)
   ^^^^^^^^^^^^^^^^^^^
./pnnls.f:175:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 40 L=NPP1,M
           ^^^^^^^^^^^^^^
./pnnls.f:176:4: DO loop currently ends at statement:
     40        SM=SM+A(L,J)*B(L)     
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:206:11: portability: A DO loop should terminate with an END DO or CONTINUE
            DO 90 L=1,NSETP   
            ^^^^^^^^^^^^^^^
./pnnls.f:207:4: DO loop currently ends at statement:
     90        UNORM=UNORM+A(L,J)**2     
     ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:215:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 120 L=1,M  
           ^^^^^^^^^^^^
./pnnls.f:216:3: DO loop currently ends at statement:
    120        ZZ(L)=B(L)    
    ^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:217:10: warning: Reference to the procedure 'h12' has an implicit interface that is distinct from another reference: incompatible dummy argument #8: incompatible dummy data object shapes
           CALL H12 (2,NPP1,NPP1+1,M,A(1,J),1,UP,ZZ,1,1,1)   
           ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:110:10: previous reference to 'h12'
           CALL H12 (1,NK+1,NK+2,M,A(1,J),1,UP,DUMMY,1,1,0)    
           ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:240:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 150 L=1,M  
        ^^^^^^^^^^^^
./pnnls.f:241:3: DO loop currently ends at statement:
    150    B(L)=ZZ(L)    
    ^^^^^^^^^^^^^^^^^
./pnnls.f:252:13: warning: Reference to the procedure 'h12' has an implicit interface that is distinct from another reference: incompatible dummy argument #8: incompatible dummy data object shapes
              CALL H12 (2,NSETP,NPP1,M,A(1,J),1,UP,A(1,JJ),1,MDA,1)
              ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:110:10: previous reference to 'h12'
           CALL H12 (1,NK+1,NK+2,M,A(1,J),1,UP,DUMMY,1,1,0)    
           ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:257:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 180 L=NPP1,M   
           ^^^^^^^^^^^^^^^
./pnnls.f:258:3: DO loop currently ends at statement:
    180       A(L,J)=ZERO   
    ^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:360:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 310 I=1,M  
        ^^^^^^^^^^^^
./pnnls.f:361:3: DO loop currently ends at statement:
    310     ZZ(I)=B(I)    
    ^^^^^^^^^^^^^^^^^^
./pnnls.f:369:7: portability: A DO loop should terminate with an END DO or CONTINUE
        DO 340 IP=1,NSETP 
        ^^^^^^^^^^^^^^^^^
./pnnls.f:371:3: DO loop currently ends at statement:
    340     X(I)=ZZ(IP)   
    ^^^^^^^^^^^^^^^^^^^
./pnnls.f:383:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 360 I=NPP1,M   
           ^^^^^^^^^^^^^^^
./pnnls.f:384:3: DO loop currently ends at statement:
    360       SM=SM+B(I)**2 
    ^^^^^^^^^^^^^^^^^^^^^^^
./pnnls.f:386:10: portability: A DO loop should terminate with an END DO or CONTINUE
           DO 380 J=K+1,N  
           ^^^^^^^^^^^^^^
./pnnls.f:387:3: DO loop currently ends at statement:
    380       W(J)=ZERO     
    ^^^^^^^^^^^^^^^^^^^
/usr/local/clang18/bin/clang -shared -L/usr/local/clang/lib64 -L/usr/local/clang18/lib -L/usr/local/clang18/lib/x86_64-unknown-linux-gnu -L/usr/local/gcc13/lib64 -L/usr/local/lib64 -o spant.so init.o lsei.o pnnls.o -lFortran_main -lFortranRuntime -lFortranDecimal -lm
make[1]: Leaving directory '/data/gannet/ripley/R/packages/tests-clang/spant/src'
make[1]: Entering directory '/data/gannet/ripley/R/packages/tests-clang/spant/src'
make[1]: Leaving directory '/data/gannet/ripley/R/packages/tests-clang/spant/src'
installing to /data/gannet/ripley/R/packages/tests-clang/spant.Rcheck/00LOCK-spant/00new/spant/libs
** R
** data
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
** help
*** installing help indices
*** copying figures
** building package indices
** installing vignettes
** testing if installed package can be loaded from temporary location
** checking absolute paths in shared objects and dynamic libraries
** testing if installed package can be loaded from final location
** testing if installed package keeps a record of temporary installation path
* DONE (spant)