You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
REAL*8 FUNCTION PRAXIS()
COMMON/GLOBAL/ FX,LDT,DMIN,NF,NL
. /Q/ V,Q0,Q1,QA,QB,QC,QD0,QD1,QF1
RETURN
END
SUBROUTINEMIN()
COMMON/GLOBAL/ FX,LDT,DMIN,NF,NL
. /Q/ V,Q0,Q1,QA,QB,QC,QD0,QD1,QF1
RETURNENDREAL*8 FUNCTION FLIN (N,J,L,F,X,NF)
COMMON/Q/ V,Q0,Q1,QA,QB,QC,QD0,QD1,QF1
RETURN
END
SUBROUTINEQUAD()
COMMON/GLOBAL/ FX,LDT,DMIN,NF,NL
. /Q/ V,Q0,Q1,QA,QB,QC,QD0,QD1,QF1
RETURNENDSUBROUTINEPRINT()
COMMON/GLOBAL/ FX,LDT,DMIN,NF,NL
RETURNEND
Fails with:
$ lfortran -c --implicit-typing --fixed-form praxis_mwe1.f
semantic error: The order of variables in common block must be same in all programs
--> praxis_mwe1.f:7:7 - 8:45
|
7 | COMMON /GLOBAL/ FX,LDT,DMIN,NF,NL
| ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^...
...
|
8 | . /Q/ V,Q0,Q1,QA,QB,QC,QD0,QD1,QF1
| ...^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
MWE based upon the Netlib code praxis (https://netlib.org/opt/praxis):
Fails with:
The syntax with consecutive common blocks,
is described in Oracles's Fortran 77 Language Reference.
The text was updated successfully, but these errors were encountered: