Build Log
  

Build started: Project: libccp4f, Configuration: Debug|Win32

Output
  
Compiling with Intel(R) Fortran Compiler 10.1.021 [IA-32]...
ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\parser.f"
C:\Tutorial\ccp4\lib\src\parser.f(634) : Info: This variable has not been used.   [OUTWIN]
      SUBROUTINE PUTLIN(STROUT,OUTWIN)
-------------------------------^
C:\Tutorial\ccp4\lib\src\parser.f(912) : Info: This variable has not been used.   [ITYP]
      SUBROUTINE RDHEAD(JTOK,LINE,IBEG,IEND,ITYP,FVALUE,NTOK,
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\parser.f(912) : Info: This variable has not been used.   [FVALUE]
      SUBROUTINE RDHEAD(JTOK,LINE,IBEG,IEND,ITYP,FVALUE,NTOK,
-------------------------------------------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\pack_f.f"
ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\modlib.f"
C:\Tutorial\ccp4\lib\src\modlib.f(514) : Info: This variable has not been used.   [INFO]
      INTEGER            INFO, NVECTORS
-------------------------^
C:\Tutorial\ccp4\lib\src\modlib.f(516) : Info: This variable has not been used.   [ISUPPZ]
      INTEGER            ISUPPZ(2*NMAX), IWORK(10*NMAX)
-------------------------^
C:\Tutorial\ccp4\lib\src\modlib.f(516) : Info: This variable has not been used.   [IWORK]
      INTEGER            ISUPPZ(2*NMAX), IWORK(10*NMAX)
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\modlib.f(517) : Info: This variable has not been used.   [WORK]
      REAL               WORK(26*NMAX),EVALUES(NMAX),AM(NMAX,NMAX)
-------------------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\lgglib.f"
C:\Tutorial\ccp4\lib\src\lgglib.f(19) : Warning: This name has not been given an explicit type.   [ANGLE]
      function angle(v1,v2)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(29) : Warning: This name has not been given an explicit type.   [ARC]
      arc = poimult(3,3,v1,v2)/(vem(3,v1)*vem(3,v2))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(29) : Warning: This name has not been given an explicit type.   [POIMULT]
      arc = poimult(3,3,v1,v2)/(vem(3,v1)*vem(3,v2))
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(29) : Warning: This name has not been given an explicit type.   [VEM]
      arc = poimult(3,3,v1,v2)/(vem(3,v1)*vem(3,v2))
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(36) : Warning: This name has not been given an explicit type.   [ACOSD]
      angle = acosd(arc)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(42) : Warning: This name has not been given an explicit type.   [I]
      DO 10 I=1,3
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(43) : Warning: This name has not been given an explicit type.   [A]
10	A(I)=CELL(I)*V(I)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(43) : Warning: This name has not been given an explicit type.   [CELL]
10	A(I)=CELL(I)*V(I)
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(43) : Warning: This name has not been given an explicit type.   [V]
10	A(I)=CELL(I)*V(I)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(49) : Warning: This name has not been given an explicit type.   [IM]
      DIMENSION A1(IM,IN),A(IN,IM)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(49) : Warning: This name has not been given an explicit type.   [IN]
      DIMENSION A1(IM,IN),A(IN,IM)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(50) : Warning: This name has not been given an explicit type.   [II]
      DO 10 II=1,IM
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(51) : Warning: This name has not been given an explicit type.   [IJ]
      DO 10 IJ=1,IN
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(52) : Warning: This name has not been given an explicit type.   [A]
10	A(IJ,II)=A1(II,IJ)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(52) : Warning: This name has not been given an explicit type.   [A1]
10	A(IJ,II)=A1(II,IJ)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(58) : Warning: This name has not been given an explicit type.   [IM]
      DIMENSION A1(IM,IN),A2(IM,IN),OUT(IM,IN)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(58) : Warning: This name has not been given an explicit type.   [IN]
      DIMENSION A1(IM,IN),A2(IM,IN),OUT(IM,IN)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(59) : Warning: This name has not been given an explicit type.   [II]
      DO 10 II=1,IM
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(60) : Warning: This name has not been given an explicit type.   [IJ]
      DO 10 IJ=1,IN
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(61) : Warning: This name has not been given an explicit type.   [OUT]
10	OUT(II,IJ)=A1(II,IJ)+A2(II,IJ)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(61) : Warning: This name has not been given an explicit type.   [A1]
10	OUT(II,IJ)=A1(II,IJ)+A2(II,IJ)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(61) : Warning: This name has not been given an explicit type.   [A2]
10	OUT(II,IJ)=A1(II,IJ)+A2(II,IJ)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(67) : Warning: This name has not been given an explicit type.   [N]
      REAL*4 XYZ(N),XYZ0(N)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(68) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, N
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(79) : Warning: This name has not been given an explicit type.   [I1]
      DO 20 I1=1,IN
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(80) : Warning: This name has not been given an explicit type.   [V]
20	V(I1)=A(I,I1)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(80) : Warning: This name has not been given an explicit type.   [A]
20	V(I1)=A(I,I1)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(80) : Warning: This name has not been given an explicit type.   [I]
20	V(I1)=A(I,I1)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(87) : Warning: This name has not been given an explicit type.   [IM]
      DIMENSION A(IM,IN)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(87) : Warning: This name has not been given an explicit type.   [IN]
      DIMENSION A(IM,IN)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(89) : Warning: This name has not been given an explicit type.   [I1]
      DO 20 I1=1,IM
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(90) : Warning: This name has not been given an explicit type.   [VJ]
20	VJ(I1)=A(I1,IJ)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(90) : Warning: This name has not been given an explicit type.   [A]
20	VJ(I1)=A(I1,IJ)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(90) : Warning: This name has not been given an explicit type.   [IJ]
20	VJ(I1)=A(I1,IJ)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(97) : Warning: This name has not been given an explicit type.   [IM]
      DIMENSION A1(IM,IN),A(IM,IN)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(97) : Warning: This name has not been given an explicit type.   [IN]
      DIMENSION A1(IM,IN),A(IM,IN)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(98) : Warning: This name has not been given an explicit type.   [I1]
      DO 10 I1=1,IM
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(99) : Warning: This name has not been given an explicit type.   [I2]
      DO 10 I2=1,IN
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(100) : Warning: This name has not been given an explicit type.   [A]
10	A(I1,I2)=A1(I1,I2)*C
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(100) : Warning: This name has not been given an explicit type.   [A1]
10	A(I1,I2)=A1(I1,I2)*C
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(100) : Warning: This name has not been given an explicit type.   [C]
10	A(I1,I2)=A1(I1,I2)*C
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(111) : Warning: This name has not been given an explicit type.   [I]
      DO 50 I=1,IM1
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(112) : Warning: This name has not been given an explicit type.   [A1]
      CALL ARRI(IM1,IN1,A1,V1,I)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(112) : Warning: This name has not been given an explicit type.   [V1]
      CALL ARRI(IM1,IN1,A1,V1,I)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(113) : Warning: This name has not been given an explicit type.   [IJ]
      DO 40 IJ=1,IN2
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(114) : Warning: This name has not been given an explicit type.   [A2]
      CALL ARRJ(IM2,IN2,A2,V2,IJ)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(114) : Warning: This name has not been given an explicit type.   [V2]
      CALL ARRJ(IM2,IN2,A2,V2,IJ)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(115) : Warning: This name has not been given an explicit type.   [RSLT]
40	RSLT(I,IJ)=POIMULT(IN1,IM2,V1,V2)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(115) : Warning: This name has not been given an explicit type.   [POIMULT]
40	RSLT(I,IJ)=POIMULT(IN1,IM2,V1,V2)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(121) : Warning: This name has not been given an explicit type.   [IM]
      DIMENSION OUT(IM,IN),A1(IM,IN),A2(IM,IN)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(121) : Warning: This name has not been given an explicit type.   [IN]
      DIMENSION OUT(IM,IN),A1(IM,IN),A2(IM,IN)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(122) : Warning: This name has not been given an explicit type.   [II]
      DO 10 II=1,IM
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(123) : Warning: This name has not been given an explicit type.   [IJ]
      DO 10 IJ=1,IN
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(124) : Warning: This name has not been given an explicit type.   [OUT]
10	OUT(II,IJ)=A1(II,IJ)-A2(II,IJ)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(124) : Warning: This name has not been given an explicit type.   [A1]
10	OUT(II,IJ)=A1(II,IJ)-A2(II,IJ)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(124) : Warning: This name has not been given an explicit type.   [A2]
10	OUT(II,IJ)=A1(II,IJ)-A2(II,IJ)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(135) : Warning: This name has not been given an explicit type.   [IM]
      real*4 rmat(im,in)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(135) : Warning: This name has not been given an explicit type.   [IN]
      real*4 rmat(im,in)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(138) : Warning: This name has not been given an explicit type.   [J]
      do j = 1, in
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(139) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, im
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(145) : Warning: This name has not been given an explicit type.   [ERR]
      if (abs(rmat(i,j)-float(imat(i,j))).gt.err) then
---------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(156) : Warning: This name has not been given an explicit type.   [N]
      real array(n)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(157) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, n
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(158) : Warning: This name has not been given an explicit type.   [VALUE]
        array(i) = value
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(166) : Warning: This name has not been given an explicit type.   [M]
      DIMENSION XIN(M,N),AVE(M)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(166) : Warning: This name has not been given an explicit type.   [N]
      DIMENSION XIN(M,N),AVE(M)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(167) : Warning: This name has not been given an explicit type.   [XN]
      XN = N
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(168) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, M
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(169) : Warning: This name has not been given an explicit type.   [AVE]
      AVE(I) = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(170) : Warning: This name has not been given an explicit type.   [J]
      DO J = 1, N
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(171) : Warning: This name has not been given an explicit type.   [XIN]
      AVE(I) = AVE(I) + XIN(I,J)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(178) : Warning: This name has not been given an explicit type.   [BONDANGLE]
      function bondangle(xyz1,xyz2,xyz3)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(191) : Warning: This name has not been given an explicit type.   [ANGLE]
      bondangle = angle(b1,b2)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(195) : Warning: This name has not been given an explicit type.   [BONDDIHED]
      function bonddihed(xyz1,xyz2,xyz3,xyz4)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(223) : Warning: This name has not been given an explicit type.   [VEM]
      call arrmc(3,1,b321,1./vem(3,b321),view(1,1))
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(240) : Warning: This name has not been given an explicit type.   [ACOSD]
       bonddihed = acosd(bd(1))
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(242) : Warning: This name has not been given an explicit type.   [ASIND]
       bonddihed = asind(bd(2))
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(267) : Warning: This name has not been given an explicit type.   [I]
      do i = 1,20
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(278) : Warning: This name has not been given an explicit type.   [NSYM]
      DIMENSION SYM(3,4,NSYM),CELL(6)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(279) : Warning: This name has not been given an explicit type.   [IS]
      DO 20 IS=1,NSYM
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(280) : Warning: This name has not been given an explicit type.   [IC]
      DO 20 IC=1,3
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(281) : Warning: This name has not been given an explicit type.   [SYM]
20	SYM(IC,4,IS)=SYM(IC,4,IS)*CELL(IC)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(281) : Warning: This name has not been given an explicit type.   [CELL]
20	SYM(IC,4,IS)=SYM(IC,4,IS)*CELL(IC)
----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(323) : Warning: This name has not been given an explicit type.   [NATM0]
      PARAMETER (NATM0 = 50000)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(325) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XYZ1(3,NATM), XYZ2(3,NATM), A(3,3), T(3)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(335) : Warning: This name has not been given an explicit type.   [XYZ1]
      CALL RTMOV(NATM,XYZ1,A,T,DIS)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(335) : Warning: This name has not been given an explicit type.   [A]
      CALL RTMOV(NATM,XYZ1,A,T,DIS)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(335) : Warning: This name has not been given an explicit type.   [T]
      CALL RTMOV(NATM,XYZ1,A,T,DIS)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(335) : Warning: This name has not been given an explicit type.   [DIS]
      CALL RTMOV(NATM,XYZ1,A,T,DIS)
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(336) : Warning: This name has not been given an explicit type.   [XYZ2]
      CALL ARRPS(3,NATM,DIS,XYZ2,DIS)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(338) : Warning: This name has not been given an explicit type.   [ATM]
      ATM = NATM
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(339) : Warning: This name has not been given an explicit type.   [SMEAN]
      SMEAN = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(340) : Warning: This name has not been given an explicit type.   [I]
      DO I=1, NATM
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(341) : Warning: This name has not been given an explicit type.   [D]
      D = VEM(3,DIS(1,I))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(341) : Warning: This name has not been given an explicit type.   [VEM]
      D = VEM(3,DIS(1,I))
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(348) : Warning: This name has not been given an explicit type.   [RMS]
      RMS = SQRT ( DOSQ(NATM*3,DIS) / ATM )
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(348) : Warning: This name has not been given an explicit type.   [DOSQ]
      RMS = SQRT ( DOSQ(NATM*3,DIS) / ATM )
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(369) : Warning: This name has not been given an explicit type.   [J]
      WRITE(6,1) (A(1,J),J=1,3),CEN1(1),T0(1)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(369) : Warning: This name has not been given an explicit type.   [CEN1]
      WRITE(6,1) (A(1,J),J=1,3),CEN1(1),T0(1)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(369) : Warning: This name has not been given an explicit type.   [T0]
      WRITE(6,1) (A(1,J),J=1,3),CEN1(1),T0(1)
----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(377) : Warning: This name has not been given an explicit type.   [B3]
      CALL MATMULT(3,3,3,1,A,CEN1,B3)
----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(319) : Warning: This name has not been given an explicit type.   [NREF]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(319) : Warning: This name has not been given an explicit type.   [NREF1]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(326) : Warning: This name has not been given an explicit type.   [X1]
      DIMENSION X1(3,NATM0),X2(3,NATM0),DIS(3,NATM0)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(326) : Warning: This name has not been given an explicit type.   [X2]
      DIMENSION X1(3,NATM0),X2(3,NATM0),DIS(3,NATM0)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(327) : Warning: This name has not been given an explicit type.   [CEN2]
      DIMENSION CEN1(3),CEN2(3)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(328) : Warning: This name has not been given an explicit type.   [B1]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(328) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(326) : Info: This variable has not been used.   [X1]
      DIMENSION X1(3,NATM0),X2(3,NATM0),DIS(3,NATM0)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(326) : Info: This variable has not been used.   [X2]
      DIMENSION X1(3,NATM0),X2(3,NATM0),DIS(3,NATM0)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(327) : Info: This variable has not been used.   [CEN2]
      DIMENSION CEN1(3),CEN2(3)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(328) : Info: This variable has not been used.   [B1]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(328) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(397) : Warning: This name has not been given an explicit type.   [AP]
      AP=CELL(4)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(397) : Warning: This name has not been given an explicit type.   [CELL]
      AP=CELL(4)
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(398) : Warning: This name has not been given an explicit type.   [BA]
      BA=CELL(5)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(399) : Warning: This name has not been given an explicit type.   [GA]
      GA=CELL(6)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(400) : Warning: This name has not been given an explicit type.   [CRIS]
      CALL ARRMC(3,1,CRIS,0.,CRIS)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(401) : Warning: This name has not been given an explicit type.   [COASTAR]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(401) : Warning: This name has not been given an explicit type.   [COSD]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(401) : Warning: This name has not been given an explicit type.   [SIND]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(403) : Warning: This name has not been given an explicit type.   [SIASTAR]
      SIASTAR=SQRT(1.-COASTAR*COASTAR)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(410) : Warning: This name has not been given an explicit type.   [CRST]
      CALL ARRMC(3,3,CRIS,1.,CRST)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(411) : Warning: This name has not been given an explicit type.   [BUF1]
      CALL IVSN(3,CRST,BUF1,BUF2,IUF,VAL,1E-6)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(411) : Warning: This name has not been given an explicit type.   [BUF2]
      CALL IVSN(3,CRST,BUF1,BUF2,IUF,VAL,1E-6)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(411) : Warning: This name has not been given an explicit type.   [VAL]
      CALL IVSN(3,CRST,BUF1,BUF2,IUF,VAL,1E-6)
-------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(427) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XIN(3,NATM),XOUT(3,NATM),A(3,3),T(3),T0(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(428) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, NATM
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(429) : Warning: This name has not been given an explicit type.   [XIN]
      CALL ARRPS(3,1,XIN(1,I),T0,XIN(1,I))
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(429) : Warning: This name has not been given an explicit type.   [T0]
      CALL ARRPS(3,1,XIN(1,I),T0,XIN(1,I))
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(431) : Warning: This name has not been given an explicit type.   [A]
      CALL MATMULT(3,3,3,NATM,A,XIN,XOUT)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(431) : Warning: This name has not been given an explicit type.   [XOUT]
      CALL MATMULT(3,3,3,NATM,A,XIN,XOUT)
------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(433) : Warning: This name has not been given an explicit type.   [T]
      CALL ARRAD(3,1,XOUT(1,I),T,XOUT(1,I))
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(456) : Warning: This name has not been given an explicit type.   [AP]
      AP=CELL(4)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(457) : Warning: This name has not been given an explicit type.   [BA]
      BA=CELL(5)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(458) : Warning: This name has not been given an explicit type.   [GA]
      GA=CELL(6)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(459) : Warning: This name has not been given an explicit type.   [COASTAR]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(459) : Warning: This name has not been given an explicit type.   [COSD]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(459) : Warning: This name has not been given an explicit type.   [SIND]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(461) : Warning: This name has not been given an explicit type.   [SIASTAR]
      SIASTAR=SQRT(1.-COASTAR*COASTAR)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(471) : Warning: This name has not been given an explicit type.   [B1]
      CALL IVSN(3,DEOR,B1,B2,IUF,DE,1.0E-6)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(471) : Warning: This name has not been given an explicit type.   [B2]
      CALL IVSN(3,DEOR,B1,B2,IUF,DE,1.0E-6)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(471) : Warning: This name has not been given an explicit type.   [IUF]
      CALL IVSN(3,DEOR,B1,B2,IUF,DE,1.0E-6)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(471) : Warning: This name has not been given an explicit type.   [DE]
      CALL IVSN(3,DEOR,B1,B2,IUF,DE,1.0E-6)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(475) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, 3
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(476) : Warning: This name has not been given an explicit type.   [VEM]
      CELLS(I) = VEM(3,orths(1,I))
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(479) : Warning: This name has not been given an explicit type.   [ANGLE]
      CELLS(4) = ANGLE(ORTHS(1,2),ORTHS(1,3))	
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(453) : Info: This variable has not been used.   [BUFF]
      REAL BUFF(3,3)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(501) : Warning: This name has not been given an explicit type.   [B1]
      DIMENSION B1(3),B2(3),IUF(3)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(501) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3),IUF(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(501) : Warning: This name has not been given an explicit type.   [IUF]
      DIMENSION B1(3),B2(3),IUF(3)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(500) : Info: This variable has not been used.   [BUFF]
      REAL BUFF(3,3),CELL1(6)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(501) : Info: This variable has not been used.   [B1]
      DIMENSION B1(3),B2(3),IUF(3)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(501) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3),IUF(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(501) : Info: This variable has not been used.   [IUF]
      DIMENSION B1(3),B2(3),IUF(3)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(521) : Warning: This name has not been given an explicit type.   [ILINE]
      iline = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(522) : Warning: This name has not been given an explicit type.   [IS]
      is = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(525) : Warning: This name has not been given an explicit type.   [IL]
      il = lenstr(line)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(525) : Warning: This name has not been given an explicit type.   [LENSTR]
      il = lenstr(line)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(526) : Warning: This name has not been given an explicit type.   [IT]
      do it=il,1,-1
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(535) : Warning: This name has not been given an explicit type.   [IOUT]
      rewind (iout)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(537) : Warning: This name has not been given an explicit type.   [IP]
10	ip = index(line(is:il),sep)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(539) : Warning: This name has not been given an explicit type.   [IL1]
       il1 = lenstr(line(is:il))
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(541) : Warning: This name has not been given an explicit type.   [ISPS]
        do isps = is, is+il1-1
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(591) : Warning: This name has not been given an explicit type.   [Y]
      y(1) = y1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(577) : Warning: This name has not been given an explicit type.   [DEDX2]
      function dedx2(x1,x2,x3,y1,y2,y3,abc)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(591) : Warning: This name has not been given an explicit type.   [Y1]
      y(1) = y1
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(592) : Warning: This name has not been given an explicit type.   [Y2]
      y(2) = y2
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(593) : Warning: This name has not been given an explicit type.   [Y3]
      y(3) = y3
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(594) : Warning: This name has not been given an explicit type.   [ARR]
      arr(1,1) = x1 * x1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(594) : Warning: This name has not been given an explicit type.   [X1]
      arr(1,1) = x1 * x1
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(595) : Warning: This name has not been given an explicit type.   [X2]
      arr(2,1) = x2 * x2
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(596) : Warning: This name has not been given an explicit type.   [X3]
      arr(3,1) = x3 * x3
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(603) : Warning: This name has not been given an explicit type.   [B1]
      call ivsn(3,arr,b1,b2,m,de,1e-5)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(603) : Warning: This name has not been given an explicit type.   [B2]
      call ivsn(3,arr,b1,b2,m,de,1e-5)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(603) : Warning: This name has not been given an explicit type.   [M]
      call ivsn(3,arr,b1,b2,m,de,1e-5)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(603) : Warning: This name has not been given an explicit type.   [DE]
      call ivsn(3,arr,b1,b2,m,de,1e-5)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(604) : Warning: This name has not been given an explicit type.   [ABC]
      call matmult(3,3,3,1,arr,y,abc)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(616) : Warning: This name has not been given an explicit type.   [SINX]
      sinx = sind(phi(1))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(616) : Warning: This name has not been given an explicit type.   [SIND]
      sinx = sind(phi(1))
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(617) : Warning: This name has not been given an explicit type.   [COSX]
      cosx = cosd(phi(1))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(617) : Warning: This name has not been given an explicit type.   [COSD]
      cosx = cosd(phi(1))
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(618) : Warning: This name has not been given an explicit type.   [SINY]
      siny = sind(phi(2))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(619) : Warning: This name has not been given an explicit type.   [COSY]
      cosy = cosd(phi(2))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(620) : Warning: This name has not been given an explicit type.   [SINZ]
      sinz = sind(phi(3))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(621) : Warning: This name has not been given an explicit type.   [COSZ]
      cosz = cosd(phi(3))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(634) : Warning: This name has not been given an explicit type.   [DIHEDRAL]
      function dihedral(x1,x2,x3,x4)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(647) : Warning: This name has not been given an explicit type.   [ANGLE]
      dihedral = angle(b3,b4)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(651) : Warning: This name has not been given an explicit type.   [DIST]
      FUNCTION DIST(XYZ1,XYZ2)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(654) : Warning: This name has not been given an explicit type.   [DX]
      DX = XYZ1(1)-XYZ2(1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(655) : Warning: This name has not been given an explicit type.   [DY]
      DY = XYZ1(2)-XYZ2(2)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(656) : Warning: This name has not been given an explicit type.   [DZ]
      DZ = XYZ1(3)-XYZ2(3)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(665) : Warning: This name has not been given an explicit type.   [N]
      DIMENSION V(N)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(661) : Warning: This name has not been given an explicit type.   [DOSQ]
      FUNCTION DOSQ(N,V)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(667) : Warning: This name has not been given an explicit type.   [I]
      DO 10 I=1,N
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(668) : Warning: This name has not been given an explicit type.   [V]
10	DOSQ = DOSQ + V(I)*V(I)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(684) : Warning: This name has not been given an explicit type.   [I]
      do 9000 i=1,len
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(684) : Warning: This name has not been given an explicit type.   [LEN]
      do 9000 i=1,len
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(686) : Warning: This name has not been given an explicit type.   [MATCH]
          match = index(lalpha,txt(i:i))
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(717) : Warning: This name has not been given an explicit type.   [ARC]
      ARC=3.14159265359/180.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(718) : Warning: This name has not been given an explicit type.   [SIPS]
      SIPS = SIN(ROH(1)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(718) : Warning: This name has not been given an explicit type.   [ROH]
      SIPS = SIN(ROH(1)*ARC)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(719) : Warning: This name has not been given an explicit type.   [COPS]
      COPS = COS(ROH(1)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(720) : Warning: This name has not been given an explicit type.   [SITH]
      SITH = SIN(ROH(2)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(721) : Warning: This name has not been given an explicit type.   [COTH]
      COTH = COS(ROH(2)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(722) : Warning: This name has not been given an explicit type.   [SIPH]
      SIPH = SIN(ROH(3)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(723) : Warning: This name has not been given an explicit type.   [COPH]
      COPH = COS(ROH(3)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(738) : Warning: This name has not been given an explicit type.   [ITH]
      IF (ITH.EQ.1) THEN
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(739) : Warning: This name has not been given an explicit type.   [A]
      A(1,1) =-coPS*COTH*SIPH - siPS*COPH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(772) : Warning: This name has not been given an explicit type.   [A1]
      CALL ARRMC(3,3,A,ARC,A1)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(794) : Warning: This name has not been given an explicit type.   [ARC]
      ARC=3.14159265359/180.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(795) : Warning: This name has not been given an explicit type.   [SIPS]
      SIPS = SIN(ROH(1)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(795) : Warning: This name has not been given an explicit type.   [ROH]
      SIPS = SIN(ROH(1)*ARC)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(796) : Warning: This name has not been given an explicit type.   [COPS]
      COPS = COS(ROH(1)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(797) : Warning: This name has not been given an explicit type.   [SITH]
      SITH = SIN(ROH(2)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(798) : Warning: This name has not been given an explicit type.   [COTH]
      COTH = COS(ROH(2)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(799) : Warning: This name has not been given an explicit type.   [SIPH]
      SIPH = SIN(ROH(3)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(800) : Warning: This name has not been given an explicit type.   [COPH]
      COPH = COS(ROH(3)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(815) : Warning: This name has not been given an explicit type.   [ITH]
      IF (ITH.EQ.1) THEN
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(816) : Warning: This name has not been given an explicit type.   [A]
      A(1,1) = -SIPS*COPH - COPS*SIPH*SITH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(870) : Warning: This name has not been given an explicit type.   [SIPS]
      SIPS = SIN(ROH(1))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(870) : Warning: This name has not been given an explicit type.   [ROH]
      SIPS = SIN(ROH(1))
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(871) : Warning: This name has not been given an explicit type.   [COPS]
      COPS = COS(ROH(1))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(872) : Warning: This name has not been given an explicit type.   [SITH]
      SITH = SIN(ROH(2))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(873) : Warning: This name has not been given an explicit type.   [COTH]
      COTH = COS(ROH(2))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(874) : Warning: This name has not been given an explicit type.   [SIPH]
      SIPH = SIN(ROH(3))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(875) : Warning: This name has not been given an explicit type.   [COPH]
      COPH = COS(ROH(3))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(890) : Warning: This name has not been given an explicit type.   [ITH]
      IF (ITH.EQ.1) THEN
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(891) : Warning: This name has not been given an explicit type.   [A]
      A(1,1) = -SIPS*COPH - COPS*SIPH*SITH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(944) : Warning: This name has not been given an explicit type.   [ARC]
      ARC=3.14159265359/180.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(945) : Warning: This name has not been given an explicit type.   [SIPS]
      SIPS = SIN(ROH(1)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(945) : Warning: This name has not been given an explicit type.   [ROH]
      SIPS = SIN(ROH(1)*ARC)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(946) : Warning: This name has not been given an explicit type.   [COPS]
      COPS = COS(ROH(1)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(947) : Warning: This name has not been given an explicit type.   [SITH]
      SITH = SIN(ROH(2)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(948) : Warning: This name has not been given an explicit type.   [COTH]
      COTH = COS(ROH(2)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(949) : Warning: This name has not been given an explicit type.   [SIPH]
      SIPH = SIN(ROH(3)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(950) : Warning: This name has not been given an explicit type.   [COPH]
      COPH = COS(ROH(3)*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(965) : Warning: This name has not been given an explicit type.   [ITH]
      IF (ITH.EQ.1) THEN
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(966) : Warning: This name has not been given an explicit type.   [A]
      A(1,1) = -SIPS*COPH - COPS*SIPH*SITH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(999) : Warning: This name has not been given an explicit type.   [A1]
      CALL ARRMC(3,3,A,ARC,A1)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1004) : Warning: This name has not been given an explicit type.   [DSTLL2]
      function dstll2(x1,x2,y1,y2)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1018) : Warning: This name has not been given an explicit type.   [VEM]
      if (vem(3,b3).ge.1e-6) then
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1019) : Warning: This name has not been given an explicit type.   [DSTPS1]
       dstll2 = dstps1(b3,x1,y1)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1023) : Warning: This name has not been given an explicit type.   [D1]
       d1 = poimult(3,3,b5,b4)
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1023) : Warning: This name has not been given an explicit type.   [POIMULT]
       d1 = poimult(3,3,b5,b4)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1024) : Warning: This name has not been given an explicit type.   [D2]
       d2 = vem(3,b5)
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1013) : Info: This variable has not been used.   [B6]
      real b1(3),b2(3),b3(3),b4(3),b5(3),b6(3)
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1030) : Warning: This name has not been given an explicit type.   [DSTPL1]
      FUNCTION DSTPL1(VL,XYZ0,XYZ,VPL)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1048) : Warning: This name has not been given an explicit type.   [XYZ]
      CALL ARRPS(3,1,XYZ,XYZ0,BUF)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1048) : Warning: This name has not been given an explicit type.   [XYZ0]
      CALL ARRPS(3,1,XYZ,XYZ0,BUF)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1048) : Warning: This name has not been given an explicit type.   [BUF]
      CALL ARRPS(3,1,XYZ,XYZ0,BUF)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1049) : Warning: This name has not been given an explicit type.   [T]
      T=POIMULT(3,3,BUF,VL)/POIMULT(3,3,VL,VL)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1049) : Warning: This name has not been given an explicit type.   [VL]
      T=POIMULT(3,3,BUF,VL)/POIMULT(3,3,VL,VL)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1049) : Warning: This name has not been given an explicit type.   [POIMULT]
      T=POIMULT(3,3,BUF,VL)/POIMULT(3,3,VL,VL)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1051) : Warning: This name has not been given an explicit type.   [B]
      CALL ARRAD(3,1,BUF,XYZ0,B)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1052) : Warning: This name has not been given an explicit type.   [VPL]
      CALL ARRPS(3,1,XYZ,B,VPL)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1053) : Warning: This name has not been given an explicit type.   [VEM]
      DSTPL1=VEM(3,VPL)
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1058) : Warning: This name has not been given an explicit type.   [DSTPL2]
      FUNCTION DSTPL2(VL,XYZ0,XYZ,VP0,VPL)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1077) : Warning: This name has not been given an explicit type.   [XYZ]
      CALL ARRPS(3,1,XYZ,XYZ0,BUF)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1077) : Warning: This name has not been given an explicit type.   [XYZ0]
      CALL ARRPS(3,1,XYZ,XYZ0,BUF)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1077) : Warning: This name has not been given an explicit type.   [BUF]
      CALL ARRPS(3,1,XYZ,XYZ0,BUF)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1078) : Warning: This name has not been given an explicit type.   [DVL]
      DVL = VEM(3,VL)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1078) : Warning: This name has not been given an explicit type.   [VL]
      DVL = VEM(3,VL)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1078) : Warning: This name has not been given an explicit type.   [VEM]
      DVL = VEM(3,VL)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1079) : Warning: This name has not been given an explicit type.   [T]
      T= POIMULT(3,3,BUF,VL)/DVL*DVL
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1079) : Warning: This name has not been given an explicit type.   [POIMULT]
      T= POIMULT(3,3,BUF,VL)/DVL*DVL
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1081) : Warning: This name has not been given an explicit type.   [VP0]
      CALL ARRAD(3,1,BUF,XYZ0,VP0)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1082) : Warning: This name has not been given an explicit type.   [VPL]
      CALL ARRPS(3,1,XYZ,VP0,VPL)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1088) : Warning: This name has not been given an explicit type.   [DSTPLROTR]
      FUNCTION DSTPLROTR(A,T,XYZ)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1109) : Warning: This name has not been given an explicit type.   [VKAPA]
      call mtovec(a,vl,vkapa)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1110) : Warning: This name has not been given an explicit type.   [VLM]
      vlm = vem(3,vl)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1110) : Warning: This name has not been given an explicit type.   [VEM]
      vlm = vem(3,vl)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1121) : Warning: This name has not been given an explicit type.   [GO]
       go = vem(3,t)
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1124) : Warning: This name has not been given an explicit type.   [POIMULT]
       go = poimult(3,3,t,vl)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1127) : Warning: This name has not been given an explicit type.   [XYZ]
      call rtmov(3,xyz,a,t,x1)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1129) : Warning: This name has not been given an explicit type.   [DIST]
      dstplrotr = dist(x2,xyz)/(2.*sind(vkapa/2.))
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1129) : Warning: This name has not been given an explicit type.   [SIND]
      dstplrotr = dist(x2,xyz)/(2.*sind(vkapa/2.))
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1103) : Info: This variable has not been used.   [POL]
      real a(3,3),t(3),POL(3),xyz0(3),vpl(3)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1103) : Info: This variable has not been used.   [VPL]
      real a(3,3),t(3),POL(3),xyz0(3),vpl(3)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1104) : Info: This variable has not been used.   [B]
      real B(3),BUF(3),vl(3),vl0(3)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1104) : Info: This variable has not been used.   [BUF]
      real B(3),BUF(3),vl(3),vl0(3)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1105) : Info: This variable has not been used.   [B2]
      real b1(3),b2(3),x1(3),x2(3)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1133) : Warning: This name has not been given an explicit type.   [DSTPS1]
      FUNCTION DSTPS1(VS,XYZ0,XYZ)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1147) : Warning: This name has not been given an explicit type.   [XYZ]
      CALL ARRPS(3,1,XYZ,XYZ0,BUF)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1147) : Warning: This name has not been given an explicit type.   [XYZ0]
      CALL ARRPS(3,1,XYZ,XYZ0,BUF)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1147) : Warning: This name has not been given an explicit type.   [BUF]
      CALL ARRPS(3,1,XYZ,XYZ0,BUF)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1148) : Warning: This name has not been given an explicit type.   [VS]
      DSTPS1=POIMULT(3,3,VS,BUF)/VEM(3,VS)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1148) : Warning: This name has not been given an explicit type.   [POIMULT]
      DSTPS1=POIMULT(3,3,VS,BUF)/VEM(3,VS)
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1148) : Warning: This name has not been given an explicit type.   [VEM]
      DSTPS1=POIMULT(3,3,VS,BUF)/VEM(3,VS)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1161) : Warning: This name has not been given an explicit type.   [I]
      do 9000 i=1,len
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1161) : Warning: This name has not been given an explicit type.   [LEN]
      do 9000 i=1,len
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1163) : Warning: This name has not been given an explicit type.   [NONB]
          nonb = i
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1176) : Warning: This name has not been given an explicit type.   [N]
      DIMENSION E(N,N)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1177) : Warning: This name has not been given an explicit type.   [I]
      DO 10 I=1,N
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1178) : Warning: This name has not been given an explicit type.   [E]
      E(I,I)=1.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1180) : Warning: This name has not been given an explicit type.   [IJ]
      DO 5 IJ=1,N
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1188) : Warning: This name has not been given an explicit type.   [ERROR2D]
      function error2d(xy1,xy2)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1190) : Warning: This name has not been given an explicit type.   [E1]
      e1 = xy2(1)-xy1(1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1191) : Warning: This name has not been given an explicit type.   [E2]
      e2 = xy2(2)-xy1(2)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1203) : Warning: This name has not been given an explicit type.   [NIN]
      call ccpdpn(nin,file,'readonly','F',0,0)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1205) : Warning: This name has not been given an explicit type.   [IL]
      il = lenstr(line)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1205) : Warning: This name has not been given an explicit type.   [LENSTR]
      il = lenstr(line)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1206) : Warning: This name has not been given an explicit type.   [NOUT]
      write(nout,'(a)') line(1:il)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1213) : Warning: This name has not been given an explicit type.   [N]
      REAL X(N)
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1214) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, N
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1235) : Warning: This name has not been given an explicit type.   [B3]
      B3(1) = XYZ(1) * CELL(1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1235) : Warning: This name has not been given an explicit type.   [XYZ]
      B3(1) = XYZ(1) * CELL(1)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1235) : Warning: This name has not been given an explicit type.   [CELL]
      B3(1) = XYZ(1) * CELL(1)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1239) : Warning: This name has not been given an explicit type.   [ORTH]
      CALL matmult(3,3,3,1,ORTH,B3,XYZ,B1,B2)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1239) : Warning: This name has not been given an explicit type.   [B1]
      CALL matmult(3,3,3,1,ORTH,B3,XYZ,B1,B2)
---------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1239) : Warning: This name has not been given an explicit type.   [B2]
      CALL matmult(3,3,3,1,ORTH,B3,XYZ,B1,B2)
------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1232) : Warning: This name has not been given an explicit type.   [DEOR]
      COMMON/CELL/ CELL,DEOR,ORTH
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1245) : Warning: This name has not been given an explicit type.   [X]
      IF (X.GE.1.) THEN
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1274) : Warning: This name has not been given an explicit type.   [B3]
      B3(1) = XYZ(1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1274) : Warning: This name has not been given an explicit type.   [XYZ]
      B3(1) = XYZ(1)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1277) : Warning: This name has not been given an explicit type.   [ORTH]
      CALL matmult(3,3,3,1,ORTH,B3,XYZ,B1,B2)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1277) : Warning: This name has not been given an explicit type.   [B1]
      CALL matmult(3,3,3,1,ORTH,B3,XYZ,B1,B2)
---------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1277) : Warning: This name has not been given an explicit type.   [B2]
      CALL matmult(3,3,3,1,ORTH,B3,XYZ,B1,B2)
------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1267) : Warning: This name has not been given an explicit type.   [CELL]
      COMMON/CELL/ CELL,DEOR,ORTH
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1267) : Warning: This name has not been given an explicit type.   [DEOR]
      COMMON/CELL/ CELL,DEOR,ORTH
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1313) : Warning: This name has not been given an explicit type.   [NATM]
      NATM = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1315) : Warning: This name has not been given an explicit type.   [X]
     1 , (X(I,NATM),I=1,3)
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1315) : Warning: This name has not been given an explicit type.   [I]
     1 , (X(I,NATM),I=1,3)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1355) : Warning: This name has not been given an explicit type.   [MAXATM]
      PARAMETER (MAXATM = 25000)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1367) : Warning: This name has not been given an explicit type.   [NATM]
      NATM = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1369) : Warning: This name has not been given an explicit type.   [X]
     1 , (X(I,NATM),I=1,3),occ(natm),bfac(natm)
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1369) : Warning: This name has not been given an explicit type.   [I]
     1 , (X(I,NATM),I=1,3),occ(natm),bfac(natm)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1415) : Warning: This name has not been given an explicit type.   [MAXATOM]
      parameter (maxatom = 50000)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1427) : Warning: This name has not been given an explicit type.   [NATM]
      NATM = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1429) : Warning: This name has not been given an explicit type.   [X]
     1 , (X(I,NATM),I=1,3),occ(natm),bfac(natm)
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1429) : Warning: This name has not been given an explicit type.   [I]
     1 , (X(I,NATM),I=1,3),occ(natm),bfac(natm)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1475) : Warning: This name has not been given an explicit type.   [MAXPRO]
      parameter (maxpro = 50000)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1487) : Warning: This name has not been given an explicit type.   [NATM]
      NATM = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1489) : Warning: This name has not been given an explicit type.   [X]
     1  res(natm), (X(I,NATM),I=1,3),occ(natm),bfac(natm)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1489) : Warning: This name has not been given an explicit type.   [I]
     1  res(natm), (X(I,NATM),I=1,3),occ(natm),bfac(natm)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1478) : Info: This variable has not been used.   [RES2]
      CHARACTER*4 ATOM(maxpro),RES(maxpro),SEQ(maxpro),RES2
-------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1480) : Info: This variable has not been used.   [RES1]
      CHARACTER FILNAM*80,HEAD*6,RES1*5
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1544) : Warning: This name has not been given an explicit type.   [NATM]
      NATM = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1546) : Warning: This name has not been given an explicit type.   [X]
     1 , (X(I,NATM),I=1,3)
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1546) : Warning: This name has not been given an explicit type.   [I]
     1 , (X(I,NATM),I=1,3)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1596) : Warning: This name has not been given an explicit type.   [NATM]
      NATM = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1597) : Warning: This name has not been given an explicit type.   [X]
5	READ(2,10,ERR=5,END=20) (X(I,NATM),I=1,3),
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1597) : Warning: This name has not been given an explicit type.   [I]
5	READ(2,10,ERR=5,END=20) (X(I,NATM),I=1,3),
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1615) : Warning: This name has not been given an explicit type.   [J]
      DO J = I-1, 1, -1
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1587) : Info: This variable has not been used.   [RES1]
      CHARACTER*4 ATOM(5500),RES(5500),SEQ(5500),RES1*4
-------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1662) : Warning: This name has not been given an explicit type.   [MAXATM]
      PARAMETER (MAXATM = 500 )
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1670) : Warning: This name has not been given an explicit type.   [NATM]
      NATM = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1676) : Warning: This name has not been given an explicit type.   [X]
      READ(1,10) ATOM(NATM),(X(I,NATM),I=1,3)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1676) : Warning: This name has not been given an explicit type.   [I]
      READ(1,10) ATOM(NATM),(X(I,NATM),I=1,3)
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1663) : Info: This variable has not been used.   [KEY]
      CHARACTER FILNAM*80,ATOM(MAXATM)*4,KEY*80
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1697) : Warning: This name has not been given an explicit type.   [PS]
      PS=ROT(1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1697) : Warning: This name has not been given an explicit type.   [ROT]
      PS=ROT(1)
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1698) : Warning: This name has not been given an explicit type.   [TH]
      TH=ROT(2)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1699) : Warning: This name has not been given an explicit type.   [PH]
      PH=ROT(3)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1701) : Warning: This name has not been given an explicit type.   [ARC]
      ARC=3.14159265359/180.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1702) : Warning: This name has not been given an explicit type.   [SIPS]
      SIPS = SIN(PS*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1703) : Warning: This name has not been given an explicit type.   [COPS]
      COPS = COS(PS*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1704) : Warning: This name has not been given an explicit type.   [SITH]
      SITH = SIN(TH*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1705) : Warning: This name has not been given an explicit type.   [COTH]
      COTH = COS(TH*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1706) : Warning: This name has not been given an explicit type.   [SIPH]
      SIPH = SIN(PH*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1707) : Warning: This name has not been given an explicit type.   [COPH]
      COPH = COS(PH*ARC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1708) : Warning: This name has not been given an explicit type.   [E]
      E(1,1) = COPS*COPH - SIPS*SIPH*SITH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1725) : Warning: This name has not been given an explicit type.   [PS]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1725) : Warning: This name has not been given an explicit type.   [AL]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1725) : Warning: This name has not been given an explicit type.   [PA]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1725) : Warning: This name has not been given an explicit type.   [TH]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1725) : Warning: This name has not been given an explicit type.   [BE]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1725) : Warning: This name has not been given an explicit type.   [PB]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1725) : Warning: This name has not been given an explicit type.   [PH]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1725) : Warning: This name has not been given an explicit type.   [GA]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1725) : Warning: This name has not been given an explicit type.   [PC]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1726) : Warning: This name has not been given an explicit type.   [S1]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1726) : Warning: This name has not been given an explicit type.   [SIPS]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1726) : Warning: This name has not been given an explicit type.   [S2]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1726) : Warning: This name has not been given an explicit type.   [SITH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1726) : Warning: This name has not been given an explicit type.   [S3]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1726) : Warning: This name has not been given an explicit type.   [SIPH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1727) : Warning: This name has not been given an explicit type.   [C1]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1727) : Warning: This name has not been given an explicit type.   [COPS]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1727) : Warning: This name has not been given an explicit type.   [C2]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1727) : Warning: This name has not been given an explicit type.   [COTH]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1727) : Warning: This name has not been given an explicit type.   [C3]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1727) : Warning: This name has not been given an explicit type.   [COPH]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1729) : Warning: This name has not been given an explicit type.   [ROT]
      PS=ROT(1)
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1741) : Warning: This name has not been given an explicit type.   [E]
      E(1,1) = COPS*COPH - SIPS*SIPH*SITH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1755) : Warning: This name has not been given an explicit type.   [N]
      INTEGER*4 XYZ(N),XYZ0(N)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1756) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, N
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1764) : Warning: This name has not been given an explicit type.   [IM]
      INTEGER A1(IM,IN),A(IM,IN),C
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1764) : Warning: This name has not been given an explicit type.   [IN]
      INTEGER A1(IM,IN),A(IM,IN),C
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1765) : Warning: This name has not been given an explicit type.   [I1]
      DO 10 I1=1,IM
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1766) : Warning: This name has not been given an explicit type.   [I2]
      DO 10 I2=1,IN
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1791) : Warning: This name has not been given an explicit type.   [J]
       do j = 1,3
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1792) : Warning: This name has not been given an explicit type.   [I]
       do i = 1,3
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1829) : Warning: This name has not been given an explicit type.   [IL]
       il = lenstr(sout(i))
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1829) : Warning: This name has not been given an explicit type.   [LENSTR]
       il = lenstr(sout(i))
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1831) : Warning: This name has not been given an explicit type.   [ILN]
        iln = il
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1834) : Warning: This name has not been given an explicit type.   [LG]
         lg = iln - j
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1783) : Info: This variable has not been used.   [TEMP]
      character out(3,3)*4,temp*4,in(3)*1
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1852) : Warning: This name has not been given an explicit type.   [IM1]
      INTEGER A1(IM1,IN1),A2(IM2,IN2),RSLT(IM1,IN2)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1852) : Warning: This name has not been given an explicit type.   [IN1]
      INTEGER A1(IM1,IN1),A2(IM2,IN2),RSLT(IM1,IN2)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1852) : Warning: This name has not been given an explicit type.   [IM2]
      INTEGER A1(IM1,IN1),A2(IM2,IN2),RSLT(IM1,IN2)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1852) : Warning: This name has not been given an explicit type.   [IN2]
      INTEGER A1(IM1,IN1),A2(IM2,IN2),RSLT(IM1,IN2)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1856) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, IM1
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1857) : Warning: This name has not been given an explicit type.   [J]
      DO J = 1, IN2
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1859) : Warning: This name has not been given an explicit type.   [K]
      DO k = 1, in1
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1877) : Warning: This name has not been given an explicit type.   [NMAT]
      real rt(3,4,nmat),rt2(3,4,nmat)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1881) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, nmat
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1883) : Warning: This name has not been given an explicit type.   [DE]
       call ivsn(3,rt2(1,1,i),b1,b2,me,de,1.e-4)
---------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1906) : Warning: This name has not been given an explicit type.   [N]
      DIMENSION A(N,N),ME(N),B(N),C(N)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1909) : Warning: This name has not been given an explicit type.   [DE]
      DE = 1.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1915) : Warning: This name has not been given an explicit type.   [Y]
          Y=0.
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1917) : Warning: This name has not been given an explicit type.   [A]
              IF (ABS(A(I,J)).LE.ABS(Y)) GOTO 30
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1922) : Warning: This name has not been given an explicit type.   [EP]
          IF (ABS(Y).LT.EP) then
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1930) : Warning: This name has not been given an explicit type.   [C]
              C(J) = A(J,K)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1933) : Warning: This name has not been given an explicit type.   [B]
              B(J) = A(I,J)*Y
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1955) : Warning: This name has not been given an explicit type.   [W]
              W = A(I,J)        ! swap rows k and i
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1958) : Warning: This name has not been given an explicit type.   [IW]
          IW = ME(I)            ! keep track of index changes 
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1972) : Warning: This name has not been given an explicit type.   [TH]
      TH(1) = TH1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1972) : Warning: This name has not been given an explicit type.   [TH1]
      TH(1) = TH1
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1973) : Warning: This name has not been given an explicit type.   [TH2]
      TH(2) = TH2
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1974) : Warning: This name has not been given an explicit type.   [TH3]
      TH(3) = TH3
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1975) : Warning: This name has not been given an explicit type.   [TH11]
      TH(4) = TH11
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1976) : Warning: This name has not been given an explicit type.   [TH12]
      TH(5) = TH12
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1977) : Warning: This name has not been given an explicit type.   [TH13]
      TH(6) = TH13
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(1978) : Warning: This name has not been given an explicit type.   [I]
      DO 1 I=1,6
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2009) : Warning: This name has not been given an explicit type.   [TR]
      CALL ARRMC(3,4,TR,0.,TR)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2011) : Warning: This name has not been given an explicit type.   [NTR]
      NTR = 2
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2047) : Warning: This name has not been given an explicit type.   [ISYM]
      DO ISYM = 1, NSYM
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2047) : Warning: This name has not been given an explicit type.   [NSYM]
      DO ISYM = 1, NSYM
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2048) : Warning: This name has not been given an explicit type.   [ITR]
      DO ITR = 2, NTR
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2049) : Warning: This name has not been given an explicit type.   [I]
      I = (ITR-1)*NSYM + ISYM
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2050) : Warning: This name has not been given an explicit type.   [SYM]
      CALL ARRMC(3,3, SYM(1,1,ISYM), 1., SYM(1,1,I) )
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2052) : Warning: This name has not been given an explicit type.   [J]
      DO J = 1, 3
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2096) : Warning: This name has not been given an explicit type.   [N0]
      PARAMETER (N0 = 6000 )
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2097) : Warning: This name has not been given an explicit type.   [M]
      DIMENSION A(M,N),PHI(M),DETA(N),ATA(N,N)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2097) : Warning: This name has not been given an explicit type.   [N]
      DIMENSION A(M,N),PHI(M),DETA(N),ATA(N,N)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2102) : Warning: This name has not been given an explicit type.   [A]
      CALL IVSN(M,A,B1,DETA,ME,DE,1.E-5)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2102) : Warning: This name has not been given an explicit type.   [B1]
      CALL IVSN(M,A,B1,DETA,ME,DE,1.E-5)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2102) : Warning: This name has not been given an explicit type.   [DETA]
      CALL IVSN(M,A,B1,DETA,ME,DE,1.E-5)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2102) : Warning: This name has not been given an explicit type.   [ME]
      CALL IVSN(M,A,B1,DETA,ME,DE,1.E-5)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2102) : Warning: This name has not been given an explicit type.   [DE]
      CALL IVSN(M,A,B1,DETA,ME,DE,1.E-5)
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2105) : Warning: This name has not been given an explicit type.   [I]
      DO 50 I = 1, N
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2106) : Warning: This name has not been given an explicit type.   [J]
      DO 50 J = 1, N
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2107) : Warning: This name has not been given an explicit type.   [ATA]
50	DETA(I) = DETA(I) + ATA(I,J)*PHI(J)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2107) : Warning: This name has not been given an explicit type.   [PHI]
50	DETA(I) = DETA(I) + ATA(I,J)*PHI(J)
-------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2117) : Warning: This name has not been given an explicit type.   [K]
      DO 10 K = 1,M
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2136) : Warning: This name has not been given an explicit type.   [POIMULT]
30	B1(I) = POIMULT(M, M, A(1,I), PHI)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2157) : Warning: This name has not been given an explicit type.   [IM]
      real*4 rmat(im,in)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2157) : Warning: This name has not been given an explicit type.   [IN]
      real*4 rmat(im,in)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2160) : Warning: This name has not been given an explicit type.   [J]
      do j = 1, in
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2161) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, im
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2172) : Warning: This name has not been given an explicit type.   [IM1]
      DIMENSION A1(IM1,IN1),A2(IM2,IN2),RSLT(IM1,IN2)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2172) : Warning: This name has not been given an explicit type.   [IN1]
      DIMENSION A1(IM1,IN1),A2(IM2,IN2),RSLT(IM1,IN2)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2172) : Warning: This name has not been given an explicit type.   [IM2]
      DIMENSION A1(IM1,IN1),A2(IM2,IN2),RSLT(IM1,IN2)
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2172) : Warning: This name has not been given an explicit type.   [IN2]
      DIMENSION A1(IM1,IN1),A2(IM2,IN2),RSLT(IM1,IN2)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2176) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, IM1
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2177) : Warning: This name has not been given an explicit type.   [J]
      DO J = 1, IN2
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2178) : Warning: This name has not been given an explicit type.   [RSLT]
      RSLT(I,J) = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2179) : Warning: This name has not been given an explicit type.   [K]
      DO k = 1, in1
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2180) : Warning: This name has not been given an explicit type.   [A1]
      RSLT(I,J) = RSLT(I,J) + A1(I,K)*A2(K,J)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2180) : Warning: This name has not been given an explicit type.   [A2]
      RSLT(I,J) = RSLT(I,J) + A1(I,K)*A2(K,J)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2191) : Warning: This name has not been given an explicit type.   [IM]
      real*4 rmat(im,in)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2191) : Warning: This name has not been given an explicit type.   [IN]
      real*4 rmat(im,in)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2194) : Warning: This name has not been given an explicit type.   [J]
      do j = 1, in
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2195) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, im
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2202) : Warning: This name has not been given an explicit type.   [MATSYM]
      FUNCTION MATSYM(S,TEXT,ICOL) 
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2235) : Warning: This name has not been given an explicit type.   [ICOL]
      ICOL = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2236) : Warning: This name has not been given an explicit type.   [IFIELD]
      IFIELD = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2238) : Warning: This name has not been given an explicit type.   [J]
      DO 4 J=1,4
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2239) : Warning: This name has not been given an explicit type.   [I]
      DO 4 I=1,3
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2240) : Warning: This name has not been given an explicit type.   [S]
 4    S(I,J) = 0.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2248) : Warning: This name has not been given an explicit type.   [ICOLMX]
      ICOLMX = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2255) : Warning: This name has not been given an explicit type.   [ICHAR]
      ICHAR(ICOLMX) = J
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2259) : Warning: This name has not been given an explicit type.   [JTXTSC]
      JTXTSC = I
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2270) : Warning: This name has not been given an explicit type.   [SIGN]
 104  SIGN = 1.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2273) : Warning: This name has not been given an explicit type.   [IFNUM]
      IFNUM=ICHAR(ICOL) 
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2293) : Warning: This name has not been given an explicit type.   [DIGIT]
 130  DIGIT = IFNUM 
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2324) : Warning: This name has not been given an explicit type.   [D]
      D=S(1,1)*S(2,2)*S(3,3)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2363) : Warning: This name has not been given an explicit type.   [SINX]
      sinx = sind(phi(1))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2363) : Warning: This name has not been given an explicit type.   [SIND]
      sinx = sind(phi(1))
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2364) : Warning: This name has not been given an explicit type.   [COSX]
      cosx = cosd(phi(1))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2364) : Warning: This name has not been given an explicit type.   [COSD]
      cosx = cosd(phi(1))
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2365) : Warning: This name has not been given an explicit type.   [SINY]
      siny = sind(phi(2))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2366) : Warning: This name has not been given an explicit type.   [COSY]
      cosy = cosd(phi(2))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2367) : Warning: This name has not been given an explicit type.   [SINZ]
      sinz = sind(phi(3))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2368) : Warning: This name has not been given an explicit type.   [COSZ]
      cosz = cosd(phi(3))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2398) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, 4
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2403) : Warning: This name has not been given an explicit type.   [J]
      do j = 1, 3
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2393) : Info: This variable has not been used.   [B1]
      real b1(3),b2(3)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2393) : Info: This variable has not been used.   [B2]
      real b1(3),b2(3)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2394) : Info: This variable has not been used.   [ME]
      integer me(3)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2474) : Warning: This name has not been given an explicit type.   [ASIND]
      phi(2) = asind(-rot(3,1))
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2479) : Warning: This name has not been given an explicit type.   [ATAND]
        phi(3) = atand(rot(2,1)/rot(1,1))
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2480) : Warning: This name has not been given an explicit type.   [COSD]
        if (phi(3).gt.0..and.rot(1,1)/cosd(phi(2)).lt.0.)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2507) : Warning: This name has not been given an explicit type.   [ARC]
      ARC=3.14159265359/180.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2508) : Warning: This name has not been given an explicit type.   [E]
      if (e(3,2).gt.1.0) e(3,2) = 1.0
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2510) : Warning: This name has not been given an explicit type.   [TH]
210	TH = ASIN(E(3,2))
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2511) : Warning: This name has not been given an explicit type.   [COSTH]
      COSTH = COS(TH)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2514) : Warning: This name has not been given an explicit type.   [PH]
       ph = 0.
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2515) : Warning: This name has not been given an explicit type.   [PS]
       ps = acos(e(1,1))
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2529) : Warning: This name has not been given an explicit type.   [TST]
      TST=-COSTH*SIN(PH)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2548) : Warning: This name has not been given an explicit type.   [PS1]
      PS1 = 180. + PS
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2549) : Warning: This name has not been given an explicit type.   [TH1]
      TH1 = 180. - TH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2550) : Warning: This name has not been given an explicit type.   [PH1]
      PH1 = 180. + PH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2552) : Warning: This name has not been given an explicit type.   [HB]
      HB(1)=PS
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2555) : Warning: This name has not been given an explicit type.   [HB1]
      HB1(1)=PS1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2570) : Warning: This name has not been given an explicit type.   [TH]
210	TH = ASIN(E(3,2))
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2570) : Warning: This name has not been given an explicit type.   [E]
210	TH = ASIN(E(3,2))
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2571) : Warning: This name has not been given an explicit type.   [COSTH]
      COSTH = COS(TH)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2575) : Warning: This name has not been given an explicit type.   [PH]
212	PH = E(3,3)/COSTH
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2582) : Warning: This name has not been given an explicit type.   [TST]
      TST=-COSTH*SIN(PH)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2584) : Warning: This name has not been given an explicit type.   [PS]
      PS = E(2,2)/COSTH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2599) : Warning: This name has not been given an explicit type.   [PS1]
      PS1 = 180. + PS
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2600) : Warning: This name has not been given an explicit type.   [TH1]
      TH1 = 180. - TH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2601) : Warning: This name has not been given an explicit type.   [PH1]
      PH1 = 180. + PH
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2603) : Warning: This name has not been given an explicit type.   [HB]
      HB(1)=PS
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2606) : Warning: This name has not been given an explicit type.   [HB1]
      HB1(1)=PS1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2632) : Warning: This name has not been given an explicit type.   [ASIND]
      phi(2) = asind(-rot(3,1))
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2637) : Warning: This name has not been given an explicit type.   [ATAND]
        phi(3) = atand(rot(2,1)/rot(1,1))
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2638) : Warning: This name has not been given an explicit type.   [COSD]
        if (phi(3).gt.0..and.rot(1,1)/cosd(phi(2)).lt.0.)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2662) : Warning: This name has not been given an explicit type.   [ARC]
      ARC=3.14159265359/180.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2663) : Warning: This name has not been given an explicit type.   [COSPC]
230	COSPC = (E(1,1)+E(2,2)+E(3,3)-1.0)/2.0
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2663) : Warning: This name has not been given an explicit type.   [E]
230	COSPC = (E(1,1)+E(2,2)+E(3,3)-1.0)/2.0
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2670) : Warning: This name has not been given an explicit type.   [PC]
      PC = ACOS(COSPC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2671) : Warning: This name has not been given an explicit type.   [ARG]
      ARG = (E(2,2)-COSPC)/(1.0-COSPC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2676) : Warning: This name has not been given an explicit type.   [COSPA]
235	COSPA = SQRT(ARG)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2678) : Warning: This name has not been given an explicit type.   [PA]
      PA = ACOS(COSPA)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2679) : Warning: This name has not been given an explicit type.   [SINPA]
      SINPA = SIN(PA)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2680) : Warning: This name has not been given an explicit type.   [TST]
      TST = 2*COSPA*SIN(PC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2682) : Warning: This name has not been given an explicit type.   [SINPC]
      SINPC = SIN(PC)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2686) : Warning: This name has not been given an explicit type.   [PB]
      PB = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2696) : Warning: This name has not been given an explicit type.   [FAC]
240	FAC = 2.0*SINPA*COSPA*(1.0-COSPC)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2701) : Warning: This name has not been given an explicit type.   [DENOM]
245	DENOM = (1.0-ARG)*(COSPC-1.0)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2703) : Warning: This name has not been given an explicit type.   [SINSPB]
      SINSPB = (COSPC-E(3,3))/DENOM
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2708) : Warning: This name has not been given an explicit type.   [TH1]
      TH1 = 180. - PA
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2709) : Warning: This name has not been given an explicit type.   [PH1]
      PH1 = 180. + PB
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2710) : Warning: This name has not been given an explicit type.   [PK1]
      PK1 =      - PC
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2712) : Warning: This name has not been given an explicit type.   [POL]
      POL(1)=PA
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2715) : Warning: This name has not been given an explicit type.   [POL1]
      POL1(1)=TH1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2727) : Warning: This name has not been given an explicit type.   [E]
      call mtovec(e,b1,p1(3))
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2727) : Warning: This name has not been given an explicit type.   [B1]
      call mtovec(e,b1,p1(3))
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2727) : Warning: This name has not been given an explicit type.   [P1]
      call mtovec(e,b1,p1(3))
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2732) : Warning: This name has not been given an explicit type.   [P2]
      p2(1) = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2738) : Warning: This name has not been given an explicit type.   [ACOSD]
      p1(1) = acosd(b1(2))
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2739) : Warning: This name has not been given an explicit type.   [DOS]
      dos = sqrt(b1(1)*b1(1)+b1(3)*b1(3))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2741) : Warning: This name has not been given an explicit type.   [VEM]
       if (vem(3,b1).eq.0.and.p1(3).ne.0.) then
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2724) : Warning: This name has not been given an explicit type.   [B2]
      dimension b1(3),b2(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2724) : Info: This variable has not been used.   [B2]
      dimension b1(3),b2(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2782) : Warning: This name has not been given an explicit type.   [ACOSD]
      p1(1) = acosd(b1(3))
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2766) : Info: This variable has not been used.   [B2]
      real b1(3),b2(3)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2811) : Warning: This name has not been given an explicit type.   [PS]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2811) : Warning: This name has not been given an explicit type.   [AL]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2811) : Warning: This name has not been given an explicit type.   [PA]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2811) : Warning: This name has not been given an explicit type.   [TH]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2811) : Warning: This name has not been given an explicit type.   [BE]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2811) : Warning: This name has not been given an explicit type.   [PB]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2811) : Warning: This name has not been given an explicit type.   [PH]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2811) : Warning: This name has not been given an explicit type.   [GA]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2811) : Warning: This name has not been given an explicit type.   [PC]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Warning: This name has not been given an explicit type.   [S1]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Warning: This name has not been given an explicit type.   [SIPS]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Warning: This name has not been given an explicit type.   [S2]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Warning: This name has not been given an explicit type.   [SITH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Warning: This name has not been given an explicit type.   [S3]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Warning: This name has not been given an explicit type.   [SIPH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Warning: This name has not been given an explicit type.   [C1]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Warning: This name has not been given an explicit type.   [COPS]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Warning: This name has not been given an explicit type.   [C2]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Warning: This name has not been given an explicit type.   [COTH]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Warning: This name has not been given an explicit type.   [C3]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Warning: This name has not been given an explicit type.   [COPH]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2816) : Warning: This name has not been given an explicit type.   [E2]
      DATA        E2 / 1., 3*0., 1., 3*0., 1./
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2817) : Warning: This name has not been given an explicit type.   [ARC]
      ARC=3.14159265359/180.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2818) : Warning: This name has not been given an explicit type.   [E]
  220 BE = ACOS(E(3,3))
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2825) : Warning: This name has not been given an explicit type.   [TST]
      TST= SIN(BE)*SIN(GA)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2843) : Warning: This name has not been given an explicit type.   [IOPT2]
      IF (IOPT2.NE.4) GO TO 225
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2847) : Warning: This name has not been given an explicit type.   [AL1]
      AL1 = 180. + AL
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2848) : Warning: This name has not been given an explicit type.   [BE1]
      BE1 =      - BE
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2849) : Warning: This name has not been given an explicit type.   [GA1]
      GA1 = 180. + GA
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2854) : Warning: This name has not been given an explicit type.   [ROT1]
      ROT1(1)=AL
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2857) : Warning: This name has not been given an explicit type.   [ROT2]
      ROT2(1)=AL1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2814) : Warning: This name has not been given an explicit type.   [E1]
      DIMENSION   E(3,3),E1(3,3),E2(3,3),X(3),X1(3)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2814) : Warning: This name has not been given an explicit type.   [X]
      DIMENSION   E(3,3),E1(3,3),E2(3,3),X(3),X1(3)
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2814) : Warning: This name has not been given an explicit type.   [X1]
      DIMENSION   E(3,3),E1(3,3),E2(3,3),X(3),X1(3)
----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Info: This variable has not been used.   [S1]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Info: This variable has not been used.   [SIPS]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Info: This variable has not been used.   [S2]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Info: This variable has not been used.   [SITH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Info: This variable has not been used.   [S3]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2812) : Info: This variable has not been used.   [SIPH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Info: This variable has not been used.   [C1]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Info: This variable has not been used.   [COPS]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Info: This variable has not been used.   [C2]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Info: This variable has not been used.   [COTH]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Info: This variable has not been used.   [C3]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2813) : Info: This variable has not been used.   [COPH]
     *            ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2814) : Info: This variable has not been used.   [E1]
      DIMENSION   E(3,3),E1(3,3),E2(3,3),X(3),X1(3)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2814) : Info: This variable has not been used.   [E2]
      DIMENSION   E(3,3),E1(3,3),E2(3,3),X(3),X1(3)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2814) : Info: This variable has not been used.   [X]
      DIMENSION   E(3,3),E1(3,3),E2(3,3),X(3),X1(3)
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2814) : Info: This variable has not been used.   [X1]
      DIMENSION   E(3,3),E1(3,3),E2(3,3),X(3),X1(3)
----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2877) : Warning: This name has not been given an explicit type.   [TRACE]
      trace = a(1,1) + a(2,2) + a(3,3)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2877) : Warning: This name has not been given an explicit type.   [A]
      trace = a(1,1) + a(2,2) + a(3,3)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2889) : Warning: This name has not been given an explicit type.   [COSKAPA]
      coskapa = (trace - 1.) / 2.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2890) : Warning: This name has not been given an explicit type.   [VKAPA]
      vkapa = acosd(coskapa)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2890) : Warning: This name has not been given an explicit type.   [ACOSD]
      vkapa = acosd(coskapa)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2894) : Warning: This name has not been given an explicit type.   [VEC]
       vec(1) = 0.
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2899) : Warning: This name has not been given an explicit type.   [I]
       do i = 1, 3
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2900) : Warning: This name has not been given an explicit type.   [TEMP]
        temp = (a(i,i)-coskapa)/(1.-coskapa)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2910) : Warning: This name has not been given an explicit type.   [VEC1]
        vec1(i) = sqrt(temp)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2912) : Warning: This name has not been given an explicit type.   [VV]
       vv = vem(3,vec1)
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2912) : Warning: This name has not been given an explicit type.   [VEM]
       vv = vem(3,vec1)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2920) : Warning: This name has not been given an explicit type.   [ERRMIN]
      errmin = 1.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2921) : Warning: This name has not been given an explicit type.   [IREAL]
      ireal = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2922) : Warning: This name has not been given an explicit type.   [IS]
      do is = 1, 8
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2927) : Warning: This name has not been given an explicit type.   [A1]
        call rotvsvec(vec,vkapa,a1)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2928) : Warning: This name has not been given an explicit type.   [A2]
        call arrps(3,3,a1,a,a2)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2930) : Warning: This name has not been given an explicit type.   [ERR]
        err = 0.
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2931) : Warning: This name has not been given an explicit type.   [IP]
        do ip = 1,9
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2991) : Warning: This name has not been given an explicit type.   [I1]
      i1 = lenstr(name1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2991) : Warning: This name has not been given an explicit type.   [LENSTR]
      i1 = lenstr(name1)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2992) : Warning: This name has not been given an explicit type.   [I]
      do i = i1, 1, -1
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(2997) : Warning: This name has not been given an explicit type.   [LEN2]
      len2 = i1 - i
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3019) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XYZ1(3,NATM), XYZ2(3,NATM), A(3,3)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3028) : Warning: This name has not been given an explicit type.   [IAT]
      IF (IAT.EQ.0) THEN
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3029) : Warning: This name has not been given an explicit type.   [IAT1]
       IAT1 = 1
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3031) : Warning: This name has not been given an explicit type.   [IAT2]
        IAT2 = INT(NATM/3) + 1
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3032) : Warning: This name has not been given an explicit type.   [IAT3]
        IAT3 = 2*INT(NATM/3) + 1
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3040) : Warning: This name has not been given an explicit type.   [XYZ1]
15	if (dist(xyz1(1,iat1),xyz1(1,iat2)).lt.1.e-3.or.
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3040) : Warning: This name has not been given an explicit type.   [DIST]
15	if (dist(xyz1(1,iat1),xyz1(1,iat2)).lt.1.e-3.or.
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3041) : Warning: This name has not been given an explicit type.   [XYZ2]
     +      dist(xyz2(1,iat1),xyz2(1,iat2)).lt.1.e-3) then
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3044) : Warning: This name has not been given an explicit type.   [A]
       call elize(3,a)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3061) : Warning: This name has not been given an explicit type.   [V11]
      CALL ARRPS(3,1,XYZ1(1,IAT2),XYZ1(1,IAT1),V11)  
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3062) : Warning: This name has not been given an explicit type.   [V12]
      CALL ARRPS(3,1,XYZ1(1,IAT2),XYZ1(1,IAT3),V12)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3063) : Warning: This name has not been given an explicit type.   [VEM]
      IF (VEM(3,V12).LT.1E-2) GOTO 50
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3064) : Warning: This name has not been given an explicit type.   [C1]
      CALL ARRMC (3,1,V12,1./VEM(3,V12),C1(1,1))
----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3065) : Warning: This name has not been given an explicit type.   [B1]
      CALL VECCRSMLT (V12,V11,B1)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3071) : Warning: This name has not been given an explicit type.   [V21]
      CALL ARRPS(3,1,XYZ2(1,IAT2),XYZ2(1,IAT1),V21)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3072) : Warning: This name has not been given an explicit type.   [V22]
      CALL ARRPS(3,1,XYZ2(1,IAT2),XYZ2(1,IAT3),V22)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3074) : Warning: This name has not been given an explicit type.   [C2]
      CALL ARRMC (3,1,V22,1./VEM(3,V22),C2(1,1))
----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3081) : Warning: This name has not been given an explicit type.   [C1P]
      call ANTIARR(3,3,C1,C1P)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3091) : Warning: This name has not been given an explicit type.   [T]
      call arrvalue(3,t,0.)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3023) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3023) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3100) : Warning: This name has not been given an explicit type.   [A1]
2000	A1=ROT(1)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3100) : Warning: This name has not been given an explicit type.   [ROT]
2000	A1=ROT(1)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3101) : Warning: This name has not been given an explicit type.   [A2]
        A2=ROT(2)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3102) : Warning: This name has not been given an explicit type.   [A3]
        A3=ROT(3)
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3103) : Warning: This name has not been given an explicit type.   [E]
      E(1,1)=COSD(A1)*COSD(A2)*COSD(A3)-SIND(A1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3103) : Warning: This name has not been given an explicit type.   [COSD]
      E(1,1)=COSD(A1)*COSD(A2)*COSD(A3)-SIND(A1)
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3103) : Warning: This name has not been given an explicit type.   [SIND]
      E(1,1)=COSD(A1)*COSD(A2)*COSD(A3)-SIND(A1)
----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3120) : Warning: This name has not been given an explicit type.   [MAXATM]
      parameter(maxatm=25000)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3140) : Warning: This name has not been given an explicit type.   [NMOVE]
      nmove = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3142) : Warning: This name has not been given an explicit type.   [NATOM]
      call averg(3,natom,xyz,ave)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3144) : Warning: This name has not been given an explicit type.   [ISYM]
      do isym = 1, nsym
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3144) : Warning: This name has not been given an explicit type.   [NSYM]
      do isym = 1, nsym
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3150) : Warning: This name has not been given an explicit type.   [I]
       do i = 1, 3
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3163) : Warning: This name has not been given an explicit type.   [JMOVE]
       do jmove = 1,27
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3166) : Warning: This name has not been given an explicit type.   [IATOM]
        do iatom = 1, natom
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3197) : Warning: This name has not been given an explicit type.   [IDUM3]
      CHARACTER*16 FUNCTION PLTNAM(IDUM3)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3197) : Info: This variable has not been used.   [IDUM3]
      CHARACTER*16 FUNCTION PLTNAM(IDUM3)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3216) : Warning: This name has not been given an explicit type.   [N1]
      DIMENSION V1(N1),V2(N2)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3216) : Warning: This name has not been given an explicit type.   [N2]
      DIMENSION V1(N1),V2(N2)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3215) : Warning: This name has not been given an explicit type.   [POIMULT]
      FUNCTION POIMULT(N1,N2,V1,V2)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3219) : Warning: This name has not been given an explicit type.   [I]
      DO 10 I=1,N1
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3220) : Warning: This name has not been given an explicit type.   [V1]
10	POIMULT=V1(I)*V2(I)+POIMULT
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3220) : Warning: This name has not been given an explicit type.   [V2]
10	POIMULT=V1(I)*V2(I)+POIMULT
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3228) : Warning: This name has not been given an explicit type.   [S1]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3228) : Warning: This name has not been given an explicit type.   [SIPS]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3228) : Warning: This name has not been given an explicit type.   [S2]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3228) : Warning: This name has not been given an explicit type.   [SITH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3228) : Warning: This name has not been given an explicit type.   [S3]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3228) : Warning: This name has not been given an explicit type.   [SIPH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3229) : Warning: This name has not been given an explicit type.   [C1]
     1  ,(C1,COPS),  (C2,COTH),  (C3,COPH)
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3229) : Warning: This name has not been given an explicit type.   [COPS]
     1  ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3229) : Warning: This name has not been given an explicit type.   [C2]
     1  ,(C1,COPS),  (C2,COTH),  (C3,COPH)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3229) : Warning: This name has not been given an explicit type.   [COTH]
     1  ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3229) : Warning: This name has not been given an explicit type.   [C3]
     1  ,(C1,COPS),  (C2,COTH),  (C3,COPH)
----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3229) : Warning: This name has not been given an explicit type.   [COPH]
     1  ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3234) : Warning: This name has not been given an explicit type.   [ARC]
      ARC=3.14159265359/180.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3235) : Warning: This name has not been given an explicit type.   [PS]
      PS=POL(1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3235) : Warning: This name has not been given an explicit type.   [POL]
      PS=POL(1)
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3236) : Warning: This name has not been given an explicit type.   [TH]
      TH=POL(2)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3237) : Warning: This name has not been given an explicit type.   [PH]
      PH=POL(3)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3246) : Warning: This name has not been given an explicit type.   [S1SQ]
130	S1SQ = S1*S1
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3247) : Warning: This name has not been given an explicit type.   [C1SQ]
      C1SQ = C1*C1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3248) : Warning: This name has not been given an explicit type.   [CPC]
      CPC  = 1.0 - C3
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3249) : Warning: This name has not been given an explicit type.   [E]
      E(1,1) = C3             + S1SQ*C2*C2*CPC
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3271) : Warning: This name has not been given an explicit type.   [B1]
      b1(2) = cosd(pol(1))	
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3271) : Warning: This name has not been given an explicit type.   [COSD]
      b1(2) = cosd(pol(1))	
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3271) : Warning: This name has not been given an explicit type.   [POL]
      b1(2) = cosd(pol(1))	
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3272) : Warning: This name has not been given an explicit type.   [SIND]
      b1(1) = sind(pol(1))*cosd(pol(2))	
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3274) : Warning: This name has not been given an explicit type.   [E]
      call rotvsvec(b1,pol(3),e)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3291) : Warning: This name has not been given an explicit type.   [COSD]
      b1(3) = cosd(pol(1))	
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3292) : Warning: This name has not been given an explicit type.   [SIND]
      b1(1) = sind(pol(1))*cosd(pol(2))	
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3312) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION POS(3,NATM), VEC(3,NATM),C(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3314) : Warning: This name has not been given an explicit type.   [POS]
      CALL AVERG(3,NATM,POS,C)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3314) : Warning: This name has not been given an explicit type.   [C]
      CALL AVERG(3,NATM,POS,C)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3316) : Warning: This name has not been given an explicit type.   [I]
      DO I=1,NATM
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3317) : Warning: This name has not been given an explicit type.   [VEC]
      CALL ARRPS(3,1,POS(1,I),C,VEC(1,I))
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3327) : Warning: This name has not been given an explicit type.   [PS]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3327) : Warning: This name has not been given an explicit type.   [AL]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3327) : Warning: This name has not been given an explicit type.   [PA]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3327) : Warning: This name has not been given an explicit type.   [TH]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3327) : Warning: This name has not been given an explicit type.   [BE]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3327) : Warning: This name has not been given an explicit type.   [PB]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3327) : Warning: This name has not been given an explicit type.   [PH]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3327) : Warning: This name has not been given an explicit type.   [GA]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3327) : Warning: This name has not been given an explicit type.   [PC]
      EQUIVALENCE  (PS,AL,PA), (TH,BE,PB), (PH,GA,PC)
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3328) : Warning: This name has not been given an explicit type.   [S1]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3328) : Warning: This name has not been given an explicit type.   [SIPS]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3328) : Warning: This name has not been given an explicit type.   [S2]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3328) : Warning: This name has not been given an explicit type.   [SITH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3328) : Warning: This name has not been given an explicit type.   [S3]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3328) : Warning: This name has not been given an explicit type.   [SIPH]
      EQUIVALENCE  (S1,SIPS),  (S2,SITH),  (S3,SIPH)
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3329) : Warning: This name has not been given an explicit type.   [C1]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3329) : Warning: This name has not been given an explicit type.   [COPS]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3329) : Warning: This name has not been given an explicit type.   [C2]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3329) : Warning: This name has not been given an explicit type.   [COTH]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3329) : Warning: This name has not been given an explicit type.   [C3]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3329) : Warning: This name has not been given an explicit type.   [COPH]
     1   ,(C1,COPS),  (C2,COTH),  (C3,COPH)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3331) : Warning: This name has not been given an explicit type.   [ROT]
      PS=ROT(1)
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3335) : Warning: This name has not been given an explicit type.   [IOTP]
      IF (IOTP.EQ.4) THEN
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3340) : Warning: This name has not been given an explicit type.   [ARC]
      ARC=3.14159265359/180.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3348) : Warning: This name has not been given an explicit type.   [E]
120	E(1,1) =-S1*C2*S3 + C1*C3
--------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3369) : Warning: This name has not been given an explicit type.   [NATM]
      real xyz(3,natm)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3374) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, natm
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3376) : Warning: This name has not been given an explicit type.   [VEM]
       lgg_radii = lgg_radii + vem(3,b2)
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3429) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, 6
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3432) : Warning: This name has not been given an explicit type.   [VEM]
     1  cof(i)/vem(3,orth(1,ic(i))),det(1,1))
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3460) : Warning: This name has not been given an explicit type.   [B1]
      CALL IVSN(3,DEOR,B1,B2,IUF,DE,1.0E-6)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3460) : Warning: This name has not been given an explicit type.   [B2]
      CALL IVSN(3,DEOR,B1,B2,IUF,DE,1.0E-6)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3460) : Warning: This name has not been given an explicit type.   [IUF]
      CALL IVSN(3,DEOR,B1,B2,IUF,DE,1.0E-6)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3460) : Warning: This name has not been given an explicit type.   [DE]
      CALL IVSN(3,DEOR,B1,B2,IUF,DE,1.0E-6)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3408) : Info: This variable has not been used.   [PDIR]
      real pdir(3,6)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3494) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, 6
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3529) : Warning: This name has not been given an explicit type.   [AP]
      AP=CELL(4)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3529) : Warning: This name has not been given an explicit type.   [CELL]
      AP=CELL(4)
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3530) : Warning: This name has not been given an explicit type.   [BA]
      BA=CELL(5)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3531) : Warning: This name has not been given an explicit type.   [GA]
      GA=CELL(6)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3532) : Warning: This name has not been given an explicit type.   [BUFF]
      CALL ARRMC(3,3,BUFF,0.,BUFF)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3533) : Warning: This name has not been given an explicit type.   [COASTAR]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3533) : Warning: This name has not been given an explicit type.   [COSD]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3533) : Warning: This name has not been given an explicit type.   [SIND]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3535) : Warning: This name has not been given an explicit type.   [SIASTAR]
      SIASTAR=SQRT(1.-COASTAR*COASTAR)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3543) : Warning: This name has not been given an explicit type.   [I]
      DO I =1, 3
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3549) : Warning: This name has not been given an explicit type.   [VOLUM]
      VOLUM = VLDIM3(BUFF)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3549) : Warning: This name has not been given an explicit type.   [VLDIM3]
      VOLUM = VLDIM3(BUFF)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3551) : Warning: This name has not been given an explicit type.   [DEOR]
      CALL VECCRSMLT(BUFF(1,2),BUFF(1,3),DEOR(1,1))
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3559) : Warning: This name has not been given an explicit type.   [VEM]
      CELL(I) = VEM(3,DEOR(1,I))
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3565) : Warning: This name has not been given an explicit type.   [ACOSD]
      CELL(4) = ACOSD(POIMULT(3,3,DEOR(1,2),DEOR(1,3)))
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3565) : Warning: This name has not been given an explicit type.   [POIMULT]
      CELL(4) = ACOSD(POIMULT(3,3,DEOR(1,2),DEOR(1,3)))
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3570) : Warning: This name has not been given an explicit type.   [ORTH]
      CALL ARRMC(3,3,DEOR,1.,ORTH)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3571) : Warning: This name has not been given an explicit type.   [B1]
      CALL IVSN(3,ORTH,B1,B2,IUF,VAL,1E-6)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3571) : Warning: This name has not been given an explicit type.   [B2]
      CALL IVSN(3,ORTH,B1,B2,IUF,VAL,1E-6)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3571) : Warning: This name has not been given an explicit type.   [IUF]
      CALL IVSN(3,ORTH,B1,B2,IUF,VAL,1E-6)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3571) : Warning: This name has not been given an explicit type.   [VAL]
      CALL IVSN(3,ORTH,B1,B2,IUF,VAL,1E-6)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3585) : Warning: This name has not been given an explicit type.   [AP]
      AP=CELL(4)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3585) : Warning: This name has not been given an explicit type.   [CELL]
      AP=CELL(4)
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3586) : Warning: This name has not been given an explicit type.   [BA]
      BA=CELL(5)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3587) : Warning: This name has not been given an explicit type.   [GA]
      GA=CELL(6)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3588) : Warning: This name has not been given an explicit type.   [BUFF]
      CALL ARRVALUE(3*3,BUFF,0.,BUFF)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3589) : Warning: This name has not been given an explicit type.   [COASTAR]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3589) : Warning: This name has not been given an explicit type.   [COSD]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3589) : Warning: This name has not been given an explicit type.   [SIND]
      COASTAR=(COSD(BA)*COSD(GA)-COSD(AP))/(SIND(BA)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3591) : Warning: This name has not been given an explicit type.   [SIASTAR]
      SIASTAR=SQRT(1.-COASTAR*COASTAR)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3599) : Warning: This name has not been given an explicit type.   [I]
      DO I =1, 3
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3605) : Warning: This name has not been given an explicit type.   [VOLUM]
      VOLUM = VLDIM3(BUFF)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3605) : Warning: This name has not been given an explicit type.   [VLDIM3]
      VOLUM = VLDIM3(BUFF)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3607) : Warning: This name has not been given an explicit type.   [ORTH]
      CALL VECCRSMLT(BUFF(1,2),BUFF(1,3),ORTH(1,1))
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3615) : Warning: This name has not been given an explicit type.   [VEM]
      CELL(I) = VEM(3,ORTH(1,I))
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3618) : Warning: This name has not been given an explicit type.   [DEOR]
      CALL ARRMC(3,1,ORTH(1,I),1./CELL(I),DEOR(1,i))
------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3621) : Warning: This name has not been given an explicit type.   [ACOSD]
      CELL(4) = ACOSD(POIMULT(3,3,DEOR(1,2),DEOR(1,3)))
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3621) : Warning: This name has not been given an explicit type.   [POIMULT]
      CELL(4) = ACOSD(POIMULT(3,3,DEOR(1,2),DEOR(1,3)))
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3627) : Warning: This name has not been given an explicit type.   [B1]
      CALL IVSN(3,DEOR,B1,B2,IUF,VAL,1E-6)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3627) : Warning: This name has not been given an explicit type.   [B2]
      CALL IVSN(3,DEOR,B1,B2,IUF,VAL,1E-6)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3627) : Warning: This name has not been given an explicit type.   [IUF]
      CALL IVSN(3,DEOR,B1,B2,IUF,VAL,1E-6)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3627) : Warning: This name has not been given an explicit type.   [VAL]
      CALL IVSN(3,DEOR,B1,B2,IUF,VAL,1E-6)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3641) : Warning: This name has not been given an explicit type.   [NPAR]
      NPAR = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3642) : Warning: This name has not been given an explicit type.   [NUNIT]
      REWIND (NUNIT)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3643) : Warning: This name has not been given an explicit type.   [I]
      I = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3644) : Warning: This name has not been given an explicit type.   [NCHA]
10	IF (I.LE.NCHA) THEN
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3646) : Warning: This name has not been given an explicit type.   [J]
            J = I
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3687) : Warning: This name has not been given an explicit type.   [NCYC]
      ncyc = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3688) : Warning: This name has not been given an explicit type.   [DEG]
      deg = 180./3.141592654
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3693) : Warning: This name has not been given an explicit type.   [RMS]
      rms = vem(9,cmat)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3693) : Warning: This name has not been given an explicit type.   [VEM]
      rms = vem(9,cmat)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3718) : Warning: This name has not been given an explicit type.   [RMS1]
      rms1 = vem(9,cmat)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3682) : Info: This variable has not been used.   [B2]
      real bmat(3,3),b1(3),b2(3),cmat(9)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3684) : Info: This variable has not been used.   [DELTA]
      real vt(9,3),vvv(3,3),delta(3),det(3)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3778) : Warning: This name has not been given an explicit type.   [NATM0]
      PARAMETER (NATM0 = 50000)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3780) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XYZ1(3,NATM), XYZ2(3,NATM), A(3,3)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3792) : Warning: This name has not been given an explicit type.   [SCALR]
      DATA SCALR/1./,SCALT/1./
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3792) : Warning: This name has not been given an explicit type.   [SCALT]
      DATA SCALR/1./,SCALT/1./
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3794) : Warning: This name has not been given an explicit type.   [DEG]
      DEG=180./3.14159265359
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3795) : Warning: This name has not been given an explicit type.   [NREF]
      NREF=0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3798) : Warning: This name has not been given an explicit type.   [A]
      CALL MTOHUBER(A,ROH,B1)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3798) : Warning: This name has not been given an explicit type.   [ROH]
      CALL MTOHUBER(A,ROH,B1)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3798) : Warning: This name has not been given an explicit type.   [B1]
      CALL MTOHUBER(A,ROH,B1)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3802) : Warning: This name has not been given an explicit type.   [XYZ1]
      CALL POS2VEC(NATM,XYZ1,VEC1)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3802) : Warning: This name has not been given an explicit type.   [VEC1]
      CALL POS2VEC(NATM,XYZ1,VEC1)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3803) : Warning: This name has not been given an explicit type.   [XYZ2]
      CALL POS2VEC(NATM,XYZ2,VEC2)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3803) : Warning: This name has not been given an explicit type.   [VEC2]
      CALL POS2VEC(NATM,XYZ2,VEC2)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3805) : Warning: This name has not been given an explicit type.   [VEC1P]
      CALL MATMULT(3,3,3,NATM,A,VEC1,VEC1P)
-------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3806) : Warning: This name has not been given an explicit type.   [DIS]
      CALL ARRPS(3,NATM,VEC1P,VEC2,DIS)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3808) : Warning: This name has not been given an explicit type.   [RMS1]
      RMS1= DOSQ( 3*NATM, DIS )
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3808) : Warning: This name has not been given an explicit type.   [DOSQ]
      RMS1= DOSQ( 3*NATM, DIS )
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3809) : Warning: This name has not been given an explicit type.   [RMS]
      RMS = sqrt(RMS1)/float(NATM)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3827) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, 3
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3828) : Warning: This name has not been given an explicit type.   [DA]
      CALL DRVROHTH(I,ROH,DA(1,1,I))
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3829) : Warning: This name has not been given an explicit type.   [VT]
      CALL MATMULT(3,3,3,NATM,DA(1,1,I),VEC1,VT(1,I))
---------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3833) : Warning: This name has not been given an explicit type.   [DETAROH]
      CALL LSQEQ(NATM*3,3,VT,DIS,DETAROH,VVV,B1)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3833) : Warning: This name has not been given an explicit type.   [VVV]
      CALL LSQEQ(NATM*3,3,VT,DIS,DETAROH,VVV,B1)
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3839) : Warning: This name has not been given an explicit type.   [ROHOLD]
      CALL ARRMC(3,1,ROH,1.,ROHOLD)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3776) : Warning: This name has not been given an explicit type.   [SMEAN]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3776) : Warning: This name has not been given an explicit type.   [NREF1]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3785) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),DETAROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3785) : Warning: This name has not been given an explicit type.   [TOLD]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),DETAROH(3),TOLD(3)
--------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3785) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),DETAROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3785) : Info: This variable has not been used.   [TOLD]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),DETAROH(3),TOLD(3)
--------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3792) : Info: This variable has not been used.   [SCALT]
      DATA SCALR/1./,SCALT/1./
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3910) : Warning: This name has not been given an explicit type.   [NATM0]
      PARAMETER (NATM0 = 50000)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3912) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XYZ1(3,NATM), XYZ2(3,NATM), A(3,3)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3922) : Warning: This name has not been given an explicit type.   [SCALR]
      SCALR = 1.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3923) : Warning: This name has not been given an explicit type.   [NREF]
      NREF=0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3926) : Warning: This name has not been given an explicit type.   [A]
      CALL MTOHUBERARC(A,ROH,B1)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3926) : Warning: This name has not been given an explicit type.   [ROH]
      CALL MTOHUBERARC(A,ROH,B1)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3926) : Warning: This name has not been given an explicit type.   [B1]
      CALL MTOHUBERARC(A,ROH,B1)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3930) : Warning: This name has not been given an explicit type.   [XYZ1]
      CALL POS2VEC(NATM,XYZ1,VEC1)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3930) : Warning: This name has not been given an explicit type.   [VEC1]
      CALL POS2VEC(NATM,XYZ1,VEC1)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3931) : Warning: This name has not been given an explicit type.   [XYZ2]
      CALL POS2VEC(NATM,XYZ2,VEC2)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3931) : Warning: This name has not been given an explicit type.   [VEC2]
      CALL POS2VEC(NATM,XYZ2,VEC2)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3933) : Warning: This name has not been given an explicit type.   [VEC1P]
      CALL MATMULT(3,3,3,NATM,A,VEC1,VEC1P)
-------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3934) : Warning: This name has not been given an explicit type.   [DIS]
      CALL ARRPS(3,NATM,VEC1P,VEC2,DIS)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3936) : Warning: This name has not been given an explicit type.   [RMS1]
      RMS1= DOSQ( 3*NATM, DIS )
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3936) : Warning: This name has not been given an explicit type.   [DOSQ]
      RMS1= DOSQ( 3*NATM, DIS )
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3937) : Warning: This name has not been given an explicit type.   [RMS]
      RMS = RMS1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3955) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, 3
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3956) : Warning: This name has not been given an explicit type.   [DA]
      CALL DRVROHTHARC(I,ROH,DA(1,1,I))
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3957) : Warning: This name has not been given an explicit type.   [VT]
      CALL MATMULT(3,3,3,NATM,DA(1,1,I),VEC1,VT(1,I))
---------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3961) : Warning: This name has not been given an explicit type.   [DETAROH]
      CALL LSQEQ(NATM*3,3,VT,DIS,DETAROH,VVV,B1)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3961) : Warning: This name has not been given an explicit type.   [VVV]
      CALL LSQEQ(NATM*3,3,VT,DIS,DETAROH,VVV,B1)
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3969) : Warning: This name has not been given an explicit type.   [ROHOLD]
      CALL ARRMC(3,1,ROH,1.,ROHOLD)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3908) : Warning: This name has not been given an explicit type.   [SMEAN]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3908) : Warning: This name has not been given an explicit type.   [NREF1]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3917) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),DETAROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3917) : Warning: This name has not been given an explicit type.   [TOLD]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),DETAROH(3),TOLD(3)
--------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3917) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),DETAROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(3917) : Info: This variable has not been used.   [TOLD]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),DETAROH(3),TOLD(3)
--------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4045) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION X1(3,NATM), X2(3,NATM), A(3,3), T(3)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4049) : Warning: This name has not been given an explicit type.   [DETA]
      DIMENSION DA(3,3,3),DROH(3),DT(3),DETA(6)
----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4049) : Warning: This name has not been given an explicit type.   [DROH]
      DIMENSION DA(3,3,3),DROH(3),DT(3),DETA(6)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4049) : Warning: This name has not been given an explicit type.   [DT]
      DIMENSION DA(3,3,3),DROH(3),DT(3),DETA(6)
----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4056) : Warning: This name has not been given an explicit type.   [DEG]
      DEG=180./3.14159265359
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4057) : Warning: This name has not been given an explicit type.   [SCALR]
      SCALR = 1.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4058) : Warning: This name has not been given an explicit type.   [SCALT]
      SCALT = 1.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4059) : Warning: This name has not been given an explicit type.   [IAT]
      iat = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4060) : Warning: This name has not been given an explicit type.   [NREF]
      NREF=0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4061) : Warning: This name has not been given an explicit type.   [EPSILON]
      epsilon = 1.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4063) : Warning: This name has not been given an explicit type.   [A]
      CALL MTOHUBER(A,ROH,B1)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4063) : Warning: This name has not been given an explicit type.   [ROH]
      CALL MTOHUBER(A,ROH,B1)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4063) : Warning: This name has not been given an explicit type.   [B1]
      CALL MTOHUBER(A,ROH,B1)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4065) : Warning: This name has not been given an explicit type.   [X1]
      CALL RTMOV(NATM,X1,A,T,DIS)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4065) : Warning: This name has not been given an explicit type.   [T]
      CALL RTMOV(NATM,X1,A,T,DIS)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4065) : Warning: This name has not been given an explicit type.   [DIS]
      CALL RTMOV(NATM,X1,A,T,DIS)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4066) : Warning: This name has not been given an explicit type.   [X2]
      CALL ARRPS(3,NATM,DIS,X2,DIS)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4067) : Warning: This name has not been given an explicit type.   [RMS]
      RMS = DOSQ(NATM*3, DIS)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4067) : Warning: This name has not been given an explicit type.   [DOSQ]
      RMS = DOSQ(NATM*3, DIS)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4068) : Warning: This name has not been given an explicit type.   [RMS1]
      RMS1 = RMS
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4069) : Warning: This name has not been given an explicit type.   [I]
        DO 5 I = 1, 3
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4070) : Warning: This name has not been given an explicit type.   [J]
         DO 5 J = 1, NATM
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4071) : Warning: This name has not been given an explicit type.   [VT]
 5	CALL ARRGIVE(3,EMT(1,I),VT((J-1)*3+1,I+3))
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4089) : Warning: This name has not been given an explicit type.   [DA]
      CALL DRVROHTH(I,ROH,DA(1,1,I))
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4100) : Warning: This name has not been given an explicit type.   [VVV]
      CALL LSQEQ(3*NATM,6,VT,DIS,DETA,VVV,VV1)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4100) : Warning: This name has not been given an explicit type.   [VV1]
      CALL LSQEQ(3*NATM,6,VT,DIS,DETA,VVV,VV1)
------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4108) : Warning: This name has not been given an explicit type.   [ROHOLD]
      CALL ARRMC(3,1,ROH,1.,ROHOLD)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4109) : Warning: This name has not been given an explicit type.   [TOLD]
      CALL ARRMC(3,1,T,1.,TOLD)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4137) : Warning: This name has not been given an explicit type.   [ATM]
      ATM = NATM
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4138) : Warning: This name has not been given an explicit type.   [SMEAN]
      SMEAN = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4140) : Warning: This name has not been given an explicit type.   [D]
      D = VEM(3,DIS(1,I))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4140) : Warning: This name has not been given an explicit type.   [VEM]
      D = VEM(3,DIS(1,I))
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4041) : Warning: This name has not been given an explicit type.   [NREF1]
      COMMON/RMS/ RMS,SMEAN,NREF1,NREF
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4050) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4050) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4198) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION X1(3,NATM), X2(3,NATM), A(3,3), T(3)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4202) : Warning: This name has not been given an explicit type.   [DETA]
      DIMENSION DA(3,3,3),DROH(3),DT(3),DETA(6)
----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4202) : Warning: This name has not been given an explicit type.   [DROH]
      DIMENSION DA(3,3,3),DROH(3),DT(3),DETA(6)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4202) : Warning: This name has not been given an explicit type.   [DT]
      DIMENSION DA(3,3,3),DROH(3),DT(3),DETA(6)
----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4207) : Warning: This name has not been given an explicit type.   [SCALR]
      DATA SCALR/1./,SCALT/1./,IAT/0/
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4207) : Warning: This name has not been given an explicit type.   [SCALT]
      DATA SCALR/1./,SCALT/1./,IAT/0/
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4207) : Warning: This name has not been given an explicit type.   [IAT]
      DATA SCALR/1./,SCALT/1./,IAT/0/
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4209) : Warning: This name has not been given an explicit type.   [DEG]
      DEG=180./3.14159265359
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4210) : Warning: This name has not been given an explicit type.   [NREF]
      NREF=0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4212) : Warning: This name has not been given an explicit type.   [A]
      CALL MTOHUBERARC(A,ROH,B1)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4212) : Warning: This name has not been given an explicit type.   [ROH]
      CALL MTOHUBERARC(A,ROH,B1)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4212) : Warning: This name has not been given an explicit type.   [B1]
      CALL MTOHUBERARC(A,ROH,B1)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4214) : Warning: This name has not been given an explicit type.   [X1]
      CALL RTMOV(NATM,X1,A,T,DIS)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4214) : Warning: This name has not been given an explicit type.   [T]
      CALL RTMOV(NATM,X1,A,T,DIS)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4214) : Warning: This name has not been given an explicit type.   [DIS]
      CALL RTMOV(NATM,X1,A,T,DIS)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4215) : Warning: This name has not been given an explicit type.   [X2]
      CALL ARRPS(3,NATM,DIS,X2,DIS)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4216) : Warning: This name has not been given an explicit type.   [RMS]
      RMS = DOSQ(NATM*3, DIS)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4216) : Warning: This name has not been given an explicit type.   [DOSQ]
      RMS = DOSQ(NATM*3, DIS)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4217) : Warning: This name has not been given an explicit type.   [RMS1]
      RMS1 = RMS
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4233) : Warning: This name has not been given an explicit type.   [I]
      DO I =1, 3
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4234) : Warning: This name has not been given an explicit type.   [DA]
      CALL DRVROHTHARC(I,ROH,DA(1,1,I))
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4235) : Warning: This name has not been given an explicit type.   [VT]
      CALL MATMULT(3,3,3,NATM,DA(1,1,I),X1,VT(1,I))
-------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4239) : Warning: This name has not been given an explicit type.   [J]
      DO J = 1, NATM
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4245) : Warning: This name has not been given an explicit type.   [VVV]
      CALL LSQEQ(3*NATM,6,VT,DIS,DETA,VVV,VV1)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4245) : Warning: This name has not been given an explicit type.   [VV1]
      CALL LSQEQ(3*NATM,6,VT,DIS,DETA,VVV,VV1)
------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4256) : Warning: This name has not been given an explicit type.   [ROHOLD]
      CALL ARRMC(3,1,ROH,1.,ROHOLD)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4257) : Warning: This name has not been given an explicit type.   [TOLD]
      CALL ARRMC(3,1,T,1.,TOLD)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4293) : Warning: This name has not been given an explicit type.   [ATM]
      ATM = NATM
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4294) : Warning: This name has not been given an explicit type.   [SMEAN]
      SMEAN = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4296) : Warning: This name has not been given an explicit type.   [D]
      D = VEM(3,DIS(1,I))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4296) : Warning: This name has not been given an explicit type.   [VEM]
      D = VEM(3,DIS(1,I))
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4195) : Warning: This name has not been given an explicit type.   [NREF1]
      COMMON/RMS/ RMS,SMEAN,NREF1,NREF
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4203) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4203) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4207) : Info: This variable has not been used.   [IAT]
      DATA SCALR/1./,SCALT/1./,IAT/0/
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4356) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION X1(3,NATM), X2(3,NATM), A(3,3), T(3)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4360) : Warning: This name has not been given an explicit type.   [DETA]
      DIMENSION DA(3,3,3),DROH(3),DT(3),DETA(6)
----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4360) : Warning: This name has not been given an explicit type.   [DROH]
      DIMENSION DA(3,3,3),DROH(3),DT(3),DETA(6)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4360) : Warning: This name has not been given an explicit type.   [DT]
      DIMENSION DA(3,3,3),DROH(3),DT(3),DETA(6)
----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4366) : Warning: This name has not been given an explicit type.   [SCALR]
      scalr = 1.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4367) : Warning: This name has not been given an explicit type.   [SCALT]
      scalt = 1.0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4368) : Warning: This name has not been given an explicit type.   [NREF]
      NREF=0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4370) : Warning: This name has not been given an explicit type.   [A]
      CALL MTOHUBERarc(A,ROH,B1)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4370) : Warning: This name has not been given an explicit type.   [ROH]
      CALL MTOHUBERarc(A,ROH,B1)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4370) : Warning: This name has not been given an explicit type.   [B1]
      CALL MTOHUBERarc(A,ROH,B1)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4372) : Warning: This name has not been given an explicit type.   [X1]
      CALL RTMOV(NATM,X1,A,T,DIS)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4372) : Warning: This name has not been given an explicit type.   [T]
      CALL RTMOV(NATM,X1,A,T,DIS)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4372) : Warning: This name has not been given an explicit type.   [DIS]
      CALL RTMOV(NATM,X1,A,T,DIS)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4373) : Warning: This name has not been given an explicit type.   [X2]
      CALL ARRPS(3,NATM,DIS,X2,DIS)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4374) : Warning: This name has not been given an explicit type.   [I]
      DO I =1, NATM
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4375) : Warning: This name has not been given an explicit type.   [DIST]
      DIST(I) = VEM(3,DIS(1,I))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4375) : Warning: This name has not been given an explicit type.   [VEM]
      DIST(I) = VEM(3,DIS(1,I))
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4377) : Warning: This name has not been given an explicit type.   [RMS]
      RMS = DOSQ(NATM*3, DIS)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4377) : Warning: This name has not been given an explicit type.   [DOSQ]
      RMS = DOSQ(NATM*3, DIS)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4378) : Warning: This name has not been given an explicit type.   [RMS1]
      RMS1 = RMS
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4395) : Warning: This name has not been given an explicit type.   [DA]
      CALL DRVROHTHarc(I,ROH,DA(1,1,I))
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4397) : Warning: This name has not been given an explicit type.   [J]
      DO J = 1, NATM
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4399) : Warning: This name has not been given an explicit type.   [VT]
      VT(J,I) = POIMULT(3,3,DIS(1,J),B1) / DIST(J)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4399) : Warning: This name has not been given an explicit type.   [POIMULT]
      VT(J,I) = POIMULT(3,3,DIS(1,J),B1) / DIST(J)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4404) : Warning: This name has not been given an explicit type.   [VVV]
      CALL LSQEQ(NATM,6,VT,DIST,DETA,VVV,VV1)
-------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4404) : Warning: This name has not been given an explicit type.   [VV1]
      CALL LSQEQ(NATM,6,VT,DIST,DETA,VVV,VV1)
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4415) : Warning: This name has not been given an explicit type.   [ROHOLD]
      CALL ARRMC(3,1,ROH,1.,ROHOLD)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4416) : Warning: This name has not been given an explicit type.   [TOLD]
      CALL ARRMC(3,1,T,1.,TOLD)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4463) : Warning: This name has not been given an explicit type.   [ATM]
      ATM = NATM
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4464) : Warning: This name has not been given an explicit type.   [SMEAN]
      SMEAN = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4466) : Warning: This name has not been given an explicit type.   [D]
      D = VEM(3,DIS(1,I))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4352) : Warning: This name has not been given an explicit type.   [NREF1]
      COMMON/RMS/ RMS,SMEAN,NREF1,NREF
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4361) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4361) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3),ROHOLD(3),ROH(3),TOLD(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4493) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, 20
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4521) : Warning: This name has not been given an explicit type.   [PAI]
      pai = 3.141592654
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4523) : Warning: This name has not been given an explicit type.   [SINKAPA]
      sinkapa = sind(vkapa)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4523) : Warning: This name has not been given an explicit type.   [SIND]
      sinkapa = sind(vkapa)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4523) : Warning: This name has not been given an explicit type.   [VKAPA]
      sinkapa = sind(vkapa)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4524) : Warning: This name has not been given an explicit type.   [COSKAPA]
      coskapa = cos(vkapa*pai/180.)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4550) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XIN(3,NATM),XOUT(3,NATM),A(3,3),T(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4551) : Warning: This name has not been given an explicit type.   [A]
      CALL MATMULT(3,3,3,NATM,A,XIN,XOUT)
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4551) : Warning: This name has not been given an explicit type.   [XIN]
      CALL MATMULT(3,3,3,NATM,A,XIN,XOUT)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4551) : Warning: This name has not been given an explicit type.   [XOUT]
      CALL MATMULT(3,3,3,NATM,A,XIN,XOUT)
------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4552) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, NATM
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4553) : Warning: This name has not been given an explicit type.   [T]
      CALL ARRAD(3,1,XOUT(1,I),T,XOUT(1,I))
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4558) : Warning: This name has not been given an explicit type.   [SCREW]
      function screw(a,t)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4577) : Warning: This name has not been given an explicit type.   [A]
      call mtovec(a,vec,vkapa)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4577) : Warning: This name has not been given an explicit type.   [VEC]
      call mtovec(a,vec,vkapa)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4577) : Warning: This name has not been given an explicit type.   [VKAPA]
      call mtovec(a,vec,vkapa)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4579) : Warning: This name has not been given an explicit type.   [T]
       screw = vem(3,t)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4579) : Warning: This name has not been given an explicit type.   [VEM]
       screw = vem(3,t)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4587) : Warning: This name has not been given an explicit type.   [POIMULT]
      screw = poimult(3,3,t,vec)
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4593) : Warning: This name has not been given an explicit type.   [NMIN]
      nmin = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4594) : Warning: This name has not been given an explicit type.   [NHOUR]
      nhour = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4595) : Warning: This name has not been given an explicit type.   [SEC]
      if (sec.gt.60.) then
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4596) : Warning: This name has not been given an explicit type.   [SMIN]
       smin = sec/60.
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4598) : Warning: This name has not been given an explicit type.   [SRES]
       sres = sec - nmin*60
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4601) : Warning: This name has not been given an explicit type.   [NMIN0]
       nmin0 = nmin
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4637) : Warning: This name has not been given an explicit type.   [T]
      call arrmc(3,1,t,0.,xyz0)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4637) : Warning: This name has not been given an explicit type.   [XYZ0]
      call arrmc(3,1,t,0.,xyz0)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4638) : Warning: This name has not been given an explicit type.   [A]
      call mtopolorz(a,POL,b1)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4638) : Warning: This name has not been given an explicit type.   [POL]
      call mtopolorz(a,POL,b1)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4638) : Warning: This name has not been given an explicit type.   [B1]
      call mtopolorz(a,POL,b1)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4640) : Warning: This name has not been given an explicit type.   [GO]
       go = vem(3,t)
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4640) : Warning: This name has not been given an explicit type.   [VEM]
       go = vem(3,t)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4648) : Warning: This name has not been given an explicit type.   [CEN1]
      call arrad(3,1,cen1,cen2,b4)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4648) : Warning: This name has not been given an explicit type.   [CEN2]
      call arrad(3,1,cen1,cen2,b4)
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4648) : Warning: This name has not been given an explicit type.   [B4]
      call arrad(3,1,cen1,cen2,b4)
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4649) : Warning: This name has not been given an explicit type.   [CEN]
      call arrmc(3,1,b4,0.5,cen)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4654) : Warning: This name has not been given an explicit type.   [VEC]
      call mtovec(a,vec,vkapa)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4654) : Warning: This name has not been given an explicit type.   [VKAPA]
      call mtovec(a,vec,vkapa)
------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4655) : Warning: This name has not been given an explicit type.   [B3]
      call arrgive(3,vec,b3)
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4657) : Warning: This name has not been given an explicit type.   [POIMULT]
      go = poimult(3,3,t,b3)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4665) : Warning: This name has not been given an explicit type.   [B5]
      call veccrsmlt(b3,b4,b5)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4666) : Warning: This name has not been given an explicit type.   [TEMP]
      temp = vem(3,b5)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4669) : Warning: This name has not been given an explicit type.   [B2]
 	 call arrmc(3,1,b5,1./temp,b2)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4674) : Warning: This name has not been given an explicit type.   [ROT]
       call arrgive(3,b2,rot(1,2))
-------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4682) : Warning: This name has not been given an explicit type.   [ROT1]
      call antiarr(3,3,rot,rot1)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4707) : Warning: This name has not been given an explicit type.   [CENP1]
      call matmult(3,3,3,1,rot1,b1,cenp1)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4709) : Warning: This name has not been given an explicit type.   [CENP2]
      call matmult(3,3,3,1,rot1,b2,cenp2)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4714) : Warning: This name has not been given an explicit type.   [XYZP]
      xyzp(1) = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4719) : Warning: This name has not been given an explicit type.   [TAND]
       xyzp(2) = -cenp1(1)/tand(vkapa/2.)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4753) : Warning: This name has not been given an explicit type.   [T]
       call arrmc(3,1,t,0.,xyz0)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4753) : Warning: This name has not been given an explicit type.   [XYZ0]
       call arrmc(3,1,t,0.,xyz0)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4754) : Warning: This name has not been given an explicit type.   [A]
      call mtopolors(a,POL,b1)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4754) : Warning: This name has not been given an explicit type.   [POL]
      call mtopolors(a,POL,b1)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4754) : Warning: This name has not been given an explicit type.   [B1]
      call mtopolors(a,POL,b1)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4756) : Warning: This name has not been given an explicit type.   [GO]
       go = vem(3,t)
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4756) : Warning: This name has not been given an explicit type.   [VEM]
       go = vem(3,t)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4767) : Warning: This name has not been given an explicit type.   [VKAPA]
      call mtovec(a,b1,vkapa)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4768) : Warning: This name has not been given an explicit type.   [VEC]
      call arrmc(3,1,b1,1.,vec)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4770) : Warning: This name has not been given an explicit type.   [POIMULT]
      go = poimult(3,3,t,b1)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4772) : Warning: This name has not been given an explicit type.   [B2]
      b2(1) = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4780) : Warning: This name has not been given an explicit type.   [B3]
      call veccrsmlt(b1,b2,b3)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4781) : Warning: This name has not been given an explicit type.   [TEMP]
      temp = vem(3,b3)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4789) : Warning: This name has not been given an explicit type.   [ROT]
       call arrmc(3,1,b2,1.,rot(1,1))
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4797) : Warning: This name has not been given an explicit type.   [ROT1]
      call antiarr(3,3,rot,rot1)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4831) : Warning: This name has not been given an explicit type.   [ROT2]
      call elize(3,rot2)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4834) : Warning: This name has not been given an explicit type.   [ROT3]
      call antiarr(3,3,rot2,rot3)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4836) : Warning: This name has not been given an explicit type.   [B4]
      call matmult(3,3,3,1,rot3,b1,b4)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4847) : Warning: This name has not been given an explicit type.   [X0]
      x0 = b4(1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4852) : Warning: This name has not been given an explicit type.   [COSD]
      b2(2) = sqrt( (1+cosd(vkapa))/(1-cosd(vkapa)) ) * b2(1)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4859) : Warning: This name has not been given an explicit type.   [ANG]
      ang = acosd( poimult(3,3,b2,b3)/(vem(3,b2)*vem(3,b3)) )
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4859) : Warning: This name has not been given an explicit type.   [ACOSD]
      ang = acosd( poimult(3,3,b2,b3)/(vem(3,b2)*vem(3,b3)) )
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4874) : Warning: This name has not been given an explicit type.   [DS1]
      ds1 = dstpl2(vec,xyz0,t,b1,b4)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4874) : Warning: This name has not been given an explicit type.   [DSTPL2]
      ds1 = dstpl2(vec,xyz0,t,b1,b4)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4876) : Warning: This name has not been given an explicit type.   [DS2]
      ds2 = dstpl2(vec,xyz0,b3,b2,b4)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4877) : Warning: This name has not been given an explicit type.   [DF]
      df = abs(ds2-ds1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4889) : Warning: This name has not been given an explicit type.   [GO1]
      go1 = vem(3,b3)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4924) : Warning: This name has not been given an explicit type.   [T]
       call arrmc(3,1,t,0.,xyz0)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4924) : Warning: This name has not been given an explicit type.   [XYZ0]
       call arrmc(3,1,t,0.,xyz0)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4925) : Warning: This name has not been given an explicit type.   [A]
      call mtopolorz(a,POL,b1)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4925) : Warning: This name has not been given an explicit type.   [POL]
      call mtopolorz(a,POL,b1)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4925) : Warning: This name has not been given an explicit type.   [B1]
      call mtopolorz(a,POL,b1)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4927) : Warning: This name has not been given an explicit type.   [GO]
       go = vem(3,t)
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4927) : Warning: This name has not been given an explicit type.   [VEM]
       go = vem(3,t)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4938) : Warning: This name has not been given an explicit type.   [VKAPA]
      call mtovec(a,b1,vkapa)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4939) : Warning: This name has not been given an explicit type.   [VEC]
      call arrmc(3,1,b1,1.,vec)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4941) : Warning: This name has not been given an explicit type.   [POIMULT]
      go = poimult(3,3,t,b1)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4943) : Warning: This name has not been given an explicit type.   [B2]
      b2(1) = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4951) : Warning: This name has not been given an explicit type.   [B3]
      call veccrsmlt(b1,b2,b3)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4952) : Warning: This name has not been given an explicit type.   [TEMP]
      temp = vem(3,b3)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4960) : Warning: This name has not been given an explicit type.   [ROT]
       call arrmc(3,1,b2,1.,rot(1,1))
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(4968) : Warning: This name has not been given an explicit type.   [ROT1]
      call antiarr(3,3,rot,rot1)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5002) : Warning: This name has not been given an explicit type.   [ROT2]
      call elize(3,rot2)
-------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5005) : Warning: This name has not been given an explicit type.   [ROT3]
      call antiarr(3,3,rot2,rot3)
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5007) : Warning: This name has not been given an explicit type.   [B4]
      call matmult(3,3,3,1,rot3,b1,b4)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5018) : Warning: This name has not been given an explicit type.   [X0]
      x0 = b4(1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5023) : Warning: This name has not been given an explicit type.   [COSD]
      b2(2) = sqrt( (1+cosd(vkapa))/(1-cosd(vkapa)) ) * b2(1)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5030) : Warning: This name has not been given an explicit type.   [ANG]
      ang = acosd( poimult(3,3,b2,b3)/(vem(3,b2)*vem(3,b3)) )
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5030) : Warning: This name has not been given an explicit type.   [ACOSD]
      ang = acosd( poimult(3,3,b2,b3)/(vem(3,b2)*vem(3,b3)) )
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5045) : Warning: This name has not been given an explicit type.   [DS1]
      ds1 = dstpl2(vec,xyz0,t,b1,b4)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5045) : Warning: This name has not been given an explicit type.   [DSTPL2]
      ds1 = dstpl2(vec,xyz0,t,b1,b4)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5047) : Warning: This name has not been given an explicit type.   [DS2]
      ds2 = dstpl2(vec,xyz0,b3,b2,b4)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5048) : Warning: This name has not been given an explicit type.   [DF]
      df = abs(ds2-ds1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5059) : Warning: This name has not been given an explicit type.   [GO1]
      go1 = vem(3,b3)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5088) : Warning: This name has not been given an explicit type.   [S1]
      S1=SQRT(P(2,1)*P(2,1)+1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5089) : Warning: This name has not been given an explicit type.   [S2]
      S2=SQRT(P(2,2)*P(2,2)+1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5094) : Warning: This name has not been given an explicit type.   [PS]
      PS(1,2)=P(2,1)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5124) : Warning: This name has not been given an explicit type.   [MAXOP]
      parameter (maxop=96)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5140) : Warning: This name has not been given an explicit type.   [LENSTR]
        call ccpdpn(nunit,file(1:lenstr(file)),'READONLY','F',0,0)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5142) : Warning: This name has not been given an explicit type.   [IM]
      im = lenstr(latnam)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5143) : Warning: This name has not been given an explicit type.   [IN]
      in = lenstr(key)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5144) : Warning: This name has not been given an explicit type.   [IS]
      is = index(key(1:in),latnam(1:im))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5147) : Warning: This name has not been given an explicit type.   [ISP]
      read(key(1:12),*,err=10,end=10) isp,iall,irot
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5147) : Warning: This name has not been given an explicit type.   [IALL]
      read(key(1:12),*,err=10,end=10) isp,iall,irot
------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5147) : Warning: This name has not been given an explicit type.   [IROT]
      read(key(1:12),*,err=10,end=10) isp,iall,irot
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5151) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, iall
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5153) : Warning: This name has not been given an explicit type.   [IL]
       il = lenstr(key)
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5155) : Warning: This name has not been given an explicit type.   [IEND]
       iend = 0
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5157) : Warning: This name has not been given an explicit type.   [IST]
20	 ist = iend+1
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5162) : Warning: This name has not been given an explicit type.   [ICOL]
        IF (MATSYM(SYM(1,1,nsym),STR,ICOL).EQ.0) GOTO 502
-------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5162) : Warning: This name has not been given an explicit type.   [MATSYM]
        IF (MATSYM(SYM(1,1,nsym),STR,ICOL).EQ.0) GOTO 502
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5169) : Warning: This name has not been given an explicit type.   [J1]
        write(6,'(4f8.4)') ((sym(j1,j2,nsym),j2=1,4),j1=1,3)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5169) : Warning: This name has not been given an explicit type.   [J2]
        write(6,'(4f8.4)') ((sym(j1,j2,nsym),j2=1,4),j1=1,3)
------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5102) : Info: This variable has not been used.   [NSP]
      subroutine spacegp(nunit,file,latnam,nsym,nrot,sym,nsp)
---------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5191) : Warning: This name has not been given an explicit type.   [LENS]
      LENS = LEN(STRING)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5192) : Warning: This name has not been given an explicit type.   [IL]
      IL = LENSTR(STRING)
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5192) : Warning: This name has not been given an explicit type.   [LENSTR]
      IL = LENSTR(STRING)
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5195) : Warning: This name has not been given an explicit type.   [ISP]
      ISP = INDEX(STRING(1:IL),' ')
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5222) : Warning: This name has not been given an explicit type.   [N]
      dimension value(n)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5223) : Warning: This name has not been given an explicit type.   [VMEAN]
      vmean = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5224) : Warning: This name has not been given an explicit type.   [I]
      do i =1, n
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5225) : Warning: This name has not been given an explicit type.   [VALUE]
      vmean = vmean + value(i)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5229) : Warning: This name has not been given an explicit type.   [RMS]
      rms = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5230) : Warning: This name has not been given an explicit type.   [DMEAN]
      dmean = 0.
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5232) : Warning: This name has not been given an explicit type.   [TEMP]
      temp = value(i) - vmean
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5258) : Warning: This name has not been given an explicit type.   [NPAR]
         NPAR = 0
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5259) : Warning: This name has not been given an explicit type.   [NUNIT]
         REWIND (NUNIT)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5262) : Warning: This name has not been given an explicit type.   [JCHA]
      jcha = 0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5263) : Warning: This name has not been given an explicit type.   [NCHA]
      if (ncha.gt.0) then
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5270) : Warning: This name has not been given an explicit type.   [I]
      I = 1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5273) : Warning: This name has not been given an explicit type.   [J]
            J = I
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5353) : Warning: This name has not been given an explicit type.   [NATM0]
      PARAMETER (NATM0 = 50000)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5355) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XYZ1(3,NATM), XYZ2(3,NATM), A(3,3), T(3)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5370) : Warning: This name has not been given an explicit type.   [XYZ1]
      CALL ORIEN(NATM,XYZ1,XYZ2,A)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5370) : Warning: This name has not been given an explicit type.   [XYZ2]
      CALL ORIEN(NATM,XYZ1,XYZ2,A)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5370) : Warning: This name has not been given an explicit type.   [A]
      CALL ORIEN(NATM,XYZ1,XYZ2,A)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5372) : Warning: This name has not been given an explicit type.   [CEN1]
      CALL AVERG(3,NATM,XYZ1,CEN1)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5373) : Warning: This name has not been given an explicit type.   [CEN2]
      CALL AVERG(3,NATM,XYZ2,CEN2)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5375) : Warning: This name has not been given an explicit type.   [T0]
      CALL ARRPS(3,1,CEN2,CEN1,T0)
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5377) : Warning: This name has not been given an explicit type.   [X1]
      CALL TMOVE(3,NATM,XYZ1,CEN1,-1.,X1)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5378) : Warning: This name has not been given an explicit type.   [X2]
      CALL TMOVE(3,NATM,XYZ2,CEN1,-1.,X2)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5382) : Warning: This name has not been given an explicit type.   [VT]
      CALL REFRT( NATM, X1, X2, A, T0, VT, DIS)
---------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5382) : Warning: This name has not been given an explicit type.   [DIS]
      CALL REFRT( NATM, X1, X2, A, T0, VT, DIS)
-------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5387) : Warning: This name has not been given an explicit type.   [RMS]
      WRITE(6,*) 'SQRT( SIGMA (Distance(i)^2)/natm ) = ',RMS
---------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5393) : Warning: This name has not been given an explicit type.   [SMEAN]
      WRITE(6,*) 'SIGMA (Distance(i)) /natm = ',SMEAN
------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5401) : Warning: This name has not been given an explicit type.   [J]
      WRITE(6,1) (A(1,J),J=1,3),CEN1(1),T0(1)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5409) : Warning: This name has not been given an explicit type.   [B3]
      CALL MATMULT(3,3,3,1,A,CEN1,B3,B1,B2)
----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5409) : Warning: This name has not been given an explicit type.   [B1]
      CALL MATMULT(3,3,3,1,A,CEN1,B3,B1,B2)
-------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5409) : Warning: This name has not been given an explicit type.   [B2]
      CALL MATMULT(3,3,3,1,A,CEN1,B3,B1,B2)
----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5411) : Warning: This name has not been given an explicit type.   [T]
      CALL ARRAD(3,1,CEN1,B3,T)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5348) : Warning: This name has not been given an explicit type.   [NREF]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5348) : Warning: This name has not been given an explicit type.   [NREF1]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5349) : Warning: This name has not been given an explicit type.   [SCALR]
      COMMON/SHIFS/ SCALR,SCALS
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5349) : Warning: This name has not been given an explicit type.   [SCALS]
      COMMON/SHIFS/ SCALR,SCALS
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5350) : Warning: This name has not been given an explicit type.   [IAT]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5350) : Warning: This name has not been given an explicit type.   [IAT1]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5350) : Warning: This name has not been given an explicit type.   [IAT2]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5350) : Warning: This name has not been given an explicit type.   [IAT3]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5480) : Warning: This name has not been given an explicit type.   [NATM0]
      PARAMETER (NATM0 = 50000)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5482) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XYZ1(3,NATM), XYZ2(3,NATM), A(3,3), T(3)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5499) : Warning: This name has not been given an explicit type.   [XYZ1]
      CALL ORIEN(NATM,XYZ1,XYZ2,A)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5499) : Warning: This name has not been given an explicit type.   [XYZ2]
      CALL ORIEN(NATM,XYZ1,XYZ2,A)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5499) : Warning: This name has not been given an explicit type.   [A]
      CALL ORIEN(NATM,XYZ1,XYZ2,A)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5504) : Warning: This name has not been given an explicit type.   [VT]
      CALL REFORN ( NATM, XYZ1, XYZ2, A, VT, DIS)
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5504) : Warning: This name has not been given an explicit type.   [DIS]
      CALL REFORN ( NATM, XYZ1, XYZ2, A, VT, DIS)
---------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5507) : Warning: This name has not been given an explicit type.   [CEN1]
      CALL AVERG(3,NATM,XYZ1,CEN1)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5508) : Warning: This name has not been given an explicit type.   [CEN2]
      CALL AVERG(3,NATM,XYZ2,CEN2)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5510) : Warning: This name has not been given an explicit type.   [T0]
      CALL ARRPS(3,1,CEN2,CEN1,T0)
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5512) : Warning: This name has not been given an explicit type.   [X1]
      CALL TMOVE(3,NATM,XYZ1,CEN1,-1.,X1)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5513) : Warning: This name has not been given an explicit type.   [X2]
      CALL TMOVE(3,NATM,XYZ2,CEN1,-1.,X2)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5522) : Warning: This name has not been given an explicit type.   [RMS]
      WRITE(6,*) 'SQRT( SIGMA (Distance(i)^2)/natm ) = ',RMS
---------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5528) : Warning: This name has not been given an explicit type.   [SMEAN]
      WRITE(6,*) 'SIGMA (Distance(i)) /natm = ',SMEAN
------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5535) : Warning: This name has not been given an explicit type.   [J]
      WRITE(6,1) (A(1,J),J=1,3),CEN1(1),T0(1)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5543) : Warning: This name has not been given an explicit type.   [B3]
      CALL MATMULT(3,3,3,1,A,CEN1,B3)
----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5545) : Warning: This name has not been given an explicit type.   [T]
      CALL ARRAD(3,1,CEN1,B3,T)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5476) : Warning: This name has not been given an explicit type.   [NREF]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5476) : Warning: This name has not been given an explicit type.   [NREF1]
      COMMON/RMS/ RMS,SMEAN,NREF,NREF1
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5477) : Warning: This name has not been given an explicit type.   [SCALR]
      COMMON/SHIFS/ SCALR,SCALS
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5477) : Warning: This name has not been given an explicit type.   [SCALS]
      COMMON/SHIFS/ SCALR,SCALS
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5478) : Warning: This name has not been given an explicit type.   [IAT]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5478) : Warning: This name has not been given an explicit type.   [IAT1]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5478) : Warning: This name has not been given an explicit type.   [IAT2]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5478) : Warning: This name has not been given an explicit type.   [IAT3]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5485) : Warning: This name has not been given an explicit type.   [B1]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5485) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5485) : Info: This variable has not been used.   [B1]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5485) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5613) : Warning: This name has not been given an explicit type.   [NATM0]
      PARAMETER (NATM0 = 50000)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5615) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XYZ1(3,NATM), XYZ2(3,NATM), A(3,3), T(3)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5632) : Warning: This name has not been given an explicit type.   [XYZ1]
      CALL ORIEN(NATM,XYZ1,XYZ2,A)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5632) : Warning: This name has not been given an explicit type.   [XYZ2]
      CALL ORIEN(NATM,XYZ1,XYZ2,A)
---------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5632) : Warning: This name has not been given an explicit type.   [A]
      CALL ORIEN(NATM,XYZ1,XYZ2,A)
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5637) : Warning: This name has not been given an explicit type.   [VT]
      CALL REFORNFIN ( NATM, XYZ1, XYZ2, A, VT, DIS)
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5637) : Warning: This name has not been given an explicit type.   [DIS]
      CALL REFORNFIN ( NATM, XYZ1, XYZ2, A, VT, DIS)
------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5638) : Warning: This name has not been given an explicit type.   [NREFORN]
      NREFORN = NREF
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5638) : Warning: This name has not been given an explicit type.   [NREF]
      NREFORN = NREF
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5641) : Warning: This name has not been given an explicit type.   [CEN1]
      CALL AVERG(3,NATM,XYZ1,CEN1)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5642) : Warning: This name has not been given an explicit type.   [CEN2]
      CALL AVERG(3,NATM,XYZ2,CEN2)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5644) : Warning: This name has not been given an explicit type.   [T0]
      CALL ARRPS(3,1,CEN2,CEN1,T0)
-------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5646) : Warning: This name has not been given an explicit type.   [X1]
      CALL TMOVE(3,NATM,XYZ1,CEN1,-1.,X1)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5647) : Warning: This name has not been given an explicit type.   [X2]
      CALL TMOVE(3,NATM,XYZ2,CEN1,-1.,X2)
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5652) : Warning: This name has not been given an explicit type.   [NREFRT]
      NREFRT = NREF1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5652) : Warning: This name has not been given an explicit type.   [NREF1]
      NREFRT = NREF1
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5654) : Warning: This name has not been given an explicit type.   [NREFRT1]
      NREFRT1 = NREF1
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5660) : Warning: This name has not been given an explicit type.   [RMS]
      WRITE(6,*) 'SQRT( SIGMA (Distance(i)^2)/natm ) = ',RMS
---------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5666) : Warning: This name has not been given an explicit type.   [SMEAN]
      WRITE(6,*) 'SIGMA (Distance(i)) /natm = ',SMEAN
------------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5673) : Warning: This name has not been given an explicit type.   [J]
      WRITE(6,1) (A(1,J),J=1,3),CEN1(1),T0(1)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5681) : Warning: This name has not been given an explicit type.   [B3]
      CALL MATMULT(3,3,3,1,A,CEN1,B3)
----------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5683) : Warning: This name has not been given an explicit type.   [T]
      CALL ARRAD(3,1,CEN1,B3,T)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5610) : Warning: This name has not been given an explicit type.   [SCALR]
      COMMON/SHIFS/ SCALR,SCALS
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5610) : Warning: This name has not been given an explicit type.   [SCALS]
      COMMON/SHIFS/ SCALR,SCALS
--------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5611) : Warning: This name has not been given an explicit type.   [IAT]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5611) : Warning: This name has not been given an explicit type.   [IAT1]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5611) : Warning: This name has not been given an explicit type.   [IAT2]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5611) : Warning: This name has not been given an explicit type.   [IAT3]
      COMMON/IAT/ IAT1,IAT2,IAT3,IAT
----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5618) : Warning: This name has not been given an explicit type.   [B1]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5618) : Warning: This name has not been given an explicit type.   [B2]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5618) : Info: This variable has not been used.   [B1]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5618) : Info: This variable has not been used.   [B2]
      DIMENSION B1(3),B2(3),B3(3),T0(3)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5717) : Warning: This name has not been given an explicit type.   [MAXOP]
      parameter (maxop=96)
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5734) : Warning: This name has not been given an explicit type.   [LENSTR]
        call ccpdpn(nunit,file(1:lenstr(file)),'READONLY','F',0,0)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5740) : Warning: This name has not been given an explicit type.   [ISP]
      read(key(1:12),*,err=10,end=10) isp,iall,irot
--------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5740) : Warning: This name has not been given an explicit type.   [IALL]
      read(key(1:12),*,err=10,end=10) isp,iall,irot
------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5740) : Warning: This name has not been given an explicit type.   [IROT]
      read(key(1:12),*,err=10,end=10) isp,iall,irot
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5749) : Warning: This name has not been given an explicit type.   [I]
      do i = 1, iall
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5751) : Warning: This name has not been given an explicit type.   [IL]
       il = lenstr(key)
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5753) : Warning: This name has not been given an explicit type.   [IEND]
       iend = 0
-------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5755) : Warning: This name has not been given an explicit type.   [IST]
20	 ist = iend+1
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5760) : Warning: This name has not been given an explicit type.   [ICOL]
        IF (MATSYM(SYM(1,1,nsym),STR,ICOL).EQ.0) GOTO 502
-------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5760) : Warning: This name has not been given an explicit type.   [MATSYM]
        IF (MATSYM(SYM(1,1,nsym),STR,ICOL).EQ.0) GOTO 502
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5767) : Warning: This name has not been given an explicit type.   [J1]
        write(6,'(4f8.4)') ((sym(j1,j2,nsym),j2=1,4),j1=1,3)
---------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5767) : Warning: This name has not been given an explicit type.   [J2]
        write(6,'(4f8.4)') ((sym(j1,j2,nsym),j2=1,4),j1=1,3)
------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5794) : Warning: This name has not been given an explicit type.   [M]
      DIMENSION XIN(M,NATM),XOUT(M,NATM),T(M),B(100)
--------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5794) : Warning: This name has not been given an explicit type.   [NATM]
      DIMENSION XIN(M,NATM),XOUT(M,NATM),T(M),B(100)
----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5795) : Warning: This name has not been given an explicit type.   [T]
      CALL ARRMC(M,1,T,CONST,B)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5795) : Warning: This name has not been given an explicit type.   [CONST]
      CALL ARRMC(M,1,T,CONST,B)
-----------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5795) : Warning: This name has not been given an explicit type.   [B]
      CALL ARRMC(M,1,T,CONST,B)
-----------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5796) : Warning: This name has not been given an explicit type.   [I]
      DO I = 1, NATM
---------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5797) : Warning: This name has not been given an explicit type.   [XIN]
      CALL ARRAD(M,1,XIN(1,I),B,XOUT(1,I))
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5797) : Warning: This name has not been given an explicit type.   [XOUT]
      CALL ARRAD(M,1,XIN(1,I),B,XOUT(1,I))
--------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5813) : Warning: This name has not been given an explicit type.   [I]
      do 9000 i=1,len
--------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5813) : Warning: This name has not been given an explicit type.   [LEN]
      do 9000 i=1,len
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5815) : Warning: This name has not been given an explicit type.   [MATCH]
          match = index(lalpha,txt(i:i))
----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5830) : Warning: This name has not been given an explicit type.   [A]
      A(1)=VLDIM2(A1(2),A1(3),A2(2),A2(3))
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5830) : Warning: This name has not been given an explicit type.   [A1]
      A(1)=VLDIM2(A1(2),A1(3),A2(2),A2(3))
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5830) : Warning: This name has not been given an explicit type.   [A2]
      A(1)=VLDIM2(A1(2),A1(3),A2(2),A2(3))
------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5830) : Warning: This name has not been given an explicit type.   [VLDIM2]
      A(1)=VLDIM2(A1(2),A1(3),A2(2),A2(3))
-----------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5837) : Warning: This name has not been given an explicit type.   [N]
      DIMENSION V(N)
------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5836) : Warning: This name has not been given an explicit type.   [VEM]
      FUNCTION VEM(N,V)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5838) : Warning: This name has not been given an explicit type.   [C]
      C=0
------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5839) : Warning: This name has not been given an explicit type.   [I]
      DO 10 I=1,N
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5840) : Warning: This name has not been given an explicit type.   [V]
10	C=C+V(I)*V(I)
------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5846) : Warning: This name has not been given an explicit type.   [VLDIM3]
      FUNCTION VLDIM3(MAT)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5852) : Warning: This name has not been given an explicit type.   [MAT]
      call veccrsmlt(mat(1,1),mat(1,2),b1)
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5852) : Warning: This name has not been given an explicit type.   [B1]
      call veccrsmlt(mat(1,1),mat(1,2),b1)
---------------------------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5853) : Warning: This name has not been given an explicit type.   [POIMULT]
      vldim3 = poimult(3,3,b1,mat(1,3))
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5857) : Warning: This name has not been given an explicit type.   [VLDIM2]
      FUNCTION VLDIM2(A11,A12,A21,A22)
---------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5858) : Warning: This name has not been given an explicit type.   [A11]
      VLDIM2=A11*A22-A21*A12
-------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5858) : Warning: This name has not been given an explicit type.   [A22]
      VLDIM2=A11*A22-A21*A12
-----------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5858) : Warning: This name has not been given an explicit type.   [A21]
      VLDIM2=A11*A22-A21*A12
---------------------^
C:\Tutorial\ccp4\lib\src\lgglib.f(5858) : Warning: This name has not been given an explicit type.   [A12]
      VLDIM2=A11*A22-A21*A12
-------------------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\harvlib.f"
C:\Tutorial\ccp4\lib\src\harvlib.f(5687) : Info: This variable has not been used.   [LINE]
      CHARACTER IDwork*6,Buffer*80,line*80,SGname*80
-----------------------------------^
C:\Tutorial\ccp4\lib\src\harsymm.inc(11) : Info: This variable has not been used.   [FVALUE]
      REAL Fvalue(MaxTokens)
-----------^
C:\Tutorial\ccp4\lib\src\harsymm.inc(12) : Info: This variable has not been used.   [IBEG]
      INTEGER Ibeg(MaxTokens),Idec(MaxTokens),Iend(MaxTokens),
--------------^
C:\Tutorial\ccp4\lib\src\harsymm.inc(12) : Info: This variable has not been used.   [IDEC]
      INTEGER Ibeg(MaxTokens),Idec(MaxTokens),Iend(MaxTokens),
------------------------------^
C:\Tutorial\ccp4\lib\src\harsymm.inc(12) : Info: This variable has not been used.   [IEND]
      INTEGER Ibeg(MaxTokens),Idec(MaxTokens),Iend(MaxTokens),
----------------------------------------------^
C:\Tutorial\ccp4\lib\src\harsymm.inc(13) : Info: This variable has not been used.   [ITYP]
     +        Ityp(MaxTokens),KnownNonStnd(MaxNonStand)
--------------^
C:\Tutorial\ccp4\lib\src\harsymm.inc(14) : Info: This variable has not been used.   [CVALUE]
      CHARACTER Cvalue(MaxTokens)*4,SGstndName(MaxStandard)*20,
----------------^
C:\Tutorial\ccp4\lib\src\harvlib.f(5685) : Info: This variable has not been used.   [I]
      INTEGER I,Ifail,ISG,IST,Jdo,KNO,Nline,NlineP,Nsymm,NsymmP,Ntok
--------------^
C:\Tutorial\ccp4\lib\src\harvlib.f(5685) : Info: This variable has not been used.   [IFAIL]
      INTEGER I,Ifail,ISG,IST,Jdo,KNO,Nline,NlineP,Nsymm,NsymmP,Ntok
----------------^
C:\Tutorial\ccp4\lib\src\harvlib.f(5685) : Info: This variable has not been used.   [ISG]
      INTEGER I,Ifail,ISG,IST,Jdo,KNO,Nline,NlineP,Nsymm,NsymmP,Ntok
----------------------^
C:\Tutorial\ccp4\lib\src\harvlib.f(5685) : Info: This variable has not been used.   [IST]
      INTEGER I,Ifail,ISG,IST,Jdo,KNO,Nline,NlineP,Nsymm,NsymmP,Ntok
--------------------------^
C:\Tutorial\ccp4\lib\src\harvlib.f(5685) : Info: This variable has not been used.   [NLINE]
      INTEGER I,Ifail,ISG,IST,Jdo,KNO,Nline,NlineP,Nsymm,NsymmP,Ntok
--------------------------------------^
C:\Tutorial\ccp4\lib\src\harvlib.f(5685) : Info: This variable has not been used.   [NLINEP]
      INTEGER I,Ifail,ISG,IST,Jdo,KNO,Nline,NlineP,Nsymm,NsymmP,Ntok
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\harvlib.f(5685) : Info: This variable has not been used.   [NSYMMP]
      INTEGER I,Ifail,ISG,IST,Jdo,KNO,Nline,NlineP,Nsymm,NsymmP,Ntok
---------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\harvlib.f(5685) : Info: This variable has not been used.   [NTOK]
      INTEGER I,Ifail,ISG,IST,Jdo,KNO,Nline,NlineP,Nsymm,NsymmP,Ntok
----------------------------------------------------------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\plot84lib.f"
C:\Tutorial\ccp4\lib\src\plot84lib.f(2053) : Info: This variable has not been used.   [IEND]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,IX,IY,MODE
-------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(2053) : Info: This variable has not been used.   [IERAS]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,IX,IY,MODE
------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(2053) : Info: This variable has not been used.   [ILWT]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,IX,IY,MODE
------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(2053) : Info: This variable has not been used.   [IPAP]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,IX,IY,MODE
-----------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(2053) : Info: This variable has not been used.   [IPEN]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,IX,IY,MODE
----------------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(2214) : Info: This variable has not been used.   [N]
      SUBROUTINE GSDRMV(X,Y,N)
----------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(5085) : Info: This variable has not been used.   [MPOINT]
      INTEGER ITERM,ITERMR,JSIZE,MALPHA,MDRAW,MHAIR,MODE,MOVE,MPOINT,
--------------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(6567) : Info: This variable has not been used.   [IDOT]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,ISTOP,IX,IY,MILSEC,NOUT
--------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(6567) : Info: This variable has not been used.   [IERAS]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,ISTOP,IX,IY,MILSEC,NOUT
------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(6567) : Info: This variable has not been used.   [ILWT]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,ISTOP,IX,IY,MILSEC,NOUT
------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(6567) : Info: This variable has not been used.   [IPAP]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,ISTOP,IX,IY,MILSEC,NOUT
-----------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(6567) : Info: This variable has not been used.   [IPEN]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,ISTOP,IX,IY,MILSEC,NOUT
----------------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(9396) : Info: This variable has not been used.   [IDOT]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,IVMODE,IX,IY,NCLCNT
--------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(9396) : Info: This variable has not been used.   [IEND]
      INTEGER IDOT,IEND,IERAS,ILWT,IPAP,IPEN,IVMODE,IX,IY,NCLCNT
-------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(9979) : Info: This variable has not been used.   [IERAS]
     +        IBYWID,ICLEAR,IDOT,IEND,IERAS,ILWT,IND,INK,IPAP,IPEN,
--------------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(10519) : Info: This variable has not been used.   [MIXCOLOR]
     +        MCNTFL,MDEVIC,MDIREC,MIXCOLOR,MOUT,MPIC,MSCAFL,NPICS,NREC,
-----------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(10530) : Info: This variable has not been used.   [IERAS]
     +        IDOT,IEND,IERAS,ILWT,IND,IPAP,IPEN,IPRINT,IPXMAX,IPXMIN,
------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(11549) : Info: This variable has not been used.   [IPAP]
      INTEGER*2 IEND,ILWT,IPAP,IPEN
--------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(11549) : Info: This variable has not been used.   [IPEN]
      INTEGER*2 IEND,ILWT,IPAP,IPEN
-------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(12865) : Info: This variable has not been used.   [IERAS]
      INTEGER*2 IDOT,IEND,ILWT,IPAP,IPEN,KX,KY,IERAS
-----------------------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(13198) : Info: This variable has not been used.   [MIXCOLOR]
     +          MDEVIC,MDIREC,MIXCOLOR,MOUT,MPIC,MSCAFL,NPICS,NREC,
------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(13207) : Info: This variable has not been used.   [IEND]
      INTEGER IEND,IERAS,ILNW,IPAP,IPEN,IUNIT
--------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(13207) : Info: This variable has not been used.   [IERAS]
      INTEGER IEND,IERAS,ILNW,IPAP,IPEN,IUNIT
-------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(13207) : Info: This variable has not been used.   [ILNW]
      INTEGER IEND,IERAS,ILNW,IPAP,IPEN,IUNIT
-------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(13207) : Info: This variable has not been used.   [IPAP]
      INTEGER IEND,IERAS,ILNW,IPAP,IPEN,IUNIT
------------------------------^
C:\Tutorial\ccp4\lib\src\plot84lib.f(13207) : Info: This variable has not been used.   [IPEN]
      INTEGER IEND,IERAS,ILNW,IPAP,IPEN,IUNIT
-----------------------------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\dna_output.f"
ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\mthlib.for"
C:\Tutorial\ccp4\lib\src\mthlib.for(21) : Warning: This name has not been given an explicit type.   [K]
      DATA K / 0, +3, -2,  -3, 0, +1,  +2, -1, 0/
-----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(24) : Warning: This name has not been given an explicit type.   [DTOR]
      DTOR = 3.14159265/180.
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(25) : Warning: This name has not been given an explicit type.   [S]
      S = SIN( ANG * DTOR)
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(25) : Warning: This name has not been given an explicit type.   [ANG]
      S = SIN( ANG * DTOR)
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(26) : Warning: This name has not been given an explicit type.   [C]
      C = COS( ANG * DTOR)
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(27) : Warning: This name has not been given an explicit type.   [UMAG]
      UMAG = SQRT( U(1)*U(1)+U(2)*U(2)+U(3)*U(3))
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(27) : Warning: This name has not been given an explicit type.   [U]
      UMAG = SQRT( U(1)*U(1)+U(2)*U(2)+U(3)*U(3))
-------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(30) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, 3
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(31) : Warning: This name has not been given an explicit type.   [V]
        V( I) = U( I)/ UMAG   
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(36) : Warning: This name has not been given an explicit type.   [J]
        DO 997 J = 1, 3
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(37) : Warning: This name has not been given an explicit type.   [R]
          R( I, J) = V( I) * V( J) * ( 1. - C)
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(66) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, 3
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(67) : Warning: This name has not been given an explicit type.   [J]
        DO 998 J = 1, 3
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(68) : Warning: This name has not been given an explicit type.   [SUM]
          SUM = 0.
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(69) : Warning: This name has not been given an explicit type.   [K]
          DO 997 K = 1, 3
-----------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(70) : Warning: This name has not been given an explicit type.   [A]
            SUM = SUM + A( I, K) * B( K, J)
------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(70) : Warning: This name has not been given an explicit type.   [B]
            SUM = SUM + A( I, K) * B( K, J)
-----------------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(72) : Warning: This name has not been given an explicit type.   [AB]
          AB( I, J) = SUM
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(84) : Warning: This name has not been given an explicit type.   [DET]
      FUNCTION DET( A)
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(91) : Warning: This name has not been given an explicit type.   [A]
      DET = A(1,1)*( A(2,2)*A(3,3) - A(2,3)*A(3,2)) +
------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(103) : Warning: This name has not been given an explicit type.   [INCMOD3]
      FUNCTION INCMOD3( I, INC)
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(107) : Warning: This name has not been given an explicit type.   [I]
      INCMOD3 = I + INC
----------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(107) : Warning: This name has not been given an explicit type.   [INC]
      INCMOD3 = I + INC
--------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(125) : Warning: This name has not been given an explicit type.   [D]
      D = DET( A)
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(125) : Warning: This name has not been given an explicit type.   [A]
      D = DET( A)
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(125) : Warning: This name has not been given an explicit type.   [DET]
      D = DET( A)
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(128) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, 3
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(129) : Warning: This name has not been given an explicit type.   [I1]
        I1 = INCMOD3( I, 1)
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(129) : Warning: This name has not been given an explicit type.   [INCMOD3]
        I1 = INCMOD3( I, 1)
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(130) : Warning: This name has not been given an explicit type.   [I2]
        I2 = INCMOD3( I, 2)
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(131) : Warning: This name has not been given an explicit type.   [J]
        DO 998 J = 1, 3
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(132) : Warning: This name has not been given an explicit type.   [J1]
          J1 = INCMOD3( J, 1)
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(133) : Warning: This name has not been given an explicit type.   [J2]
          J2 = INCMOD3( J, 2)
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(134) : Warning: This name has not been given an explicit type.   [AI]
          AI( J, I) = ( A( I1, J1)*A( I2, J2) - 
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(151) : Warning: This name has not been given an explicit type.   [IROWS]
      DIMENSION SOURCE( IROWS, ICOLS), DEST( IROWS, ICOLS)
------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(151) : Warning: This name has not been given an explicit type.   [ICOLS]
      DIMENSION SOURCE( IROWS, ICOLS), DEST( IROWS, ICOLS)
-------------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(154) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, IROWS
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(155) : Warning: This name has not been given an explicit type.   [J]
        DO 998 J = 1, ICOLS
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(156) : Warning: This name has not been given an explicit type.   [DEST]
          DEST( I, J) = SOURCE( I, J)
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(156) : Warning: This name has not been given an explicit type.   [SOURCE]
          DEST( I, J) = SOURCE( I, J)
------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(172) : Warning: This name has not been given an explicit type.   [NX]
      DIMENSION A( NX), B( NX)
-------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(175) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, NX
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(176) : Warning: This name has not been given an explicit type.   [B]
        B( I) = A( I)
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(176) : Warning: This name has not been given an explicit type.   [A]
        B( I) = A( I)
----------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(191) : Warning: This name has not been given an explicit type.   [NX]
      DIMENSION VECTOR( NX), SCALED_VECTOR( NX)
------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(194) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, NX
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(195) : Warning: This name has not been given an explicit type.   [SCALED_VECTOR]
        SCALED_VECTOR( I) = SCALAR * VECTOR( I)
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(195) : Warning: This name has not been given an explicit type.   [SCALAR]
        SCALED_VECTOR( I) = SCALAR * VECTOR( I)
----------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(195) : Warning: This name has not been given an explicit type.   [VECTOR]
        SCALED_VECTOR( I) = SCALAR * VECTOR( I)
-------------------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(210) : Warning: This name has not been given an explicit type.   [NX]
      DIMENSION A( NX), B( NX), AB( NX)
-------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(213) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, NX
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(214) : Warning: This name has not been given an explicit type.   [AB]
        AB( I) = A( I) + B( I)
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(214) : Warning: This name has not been given an explicit type.   [A]
        AB( I) = A( I) + B( I)
-----------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(214) : Warning: This name has not been given an explicit type.   [B]
        AB( I) = A( I) + B( I)
-------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(229) : Warning: This name has not been given an explicit type.   [NX]
      DIMENSION A( NX), B( NX), A_MINUS_B( NX)
-------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(232) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, NX
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(233) : Warning: This name has not been given an explicit type.   [A_MINUS_B]
        A_MINUS_B( I) = A( I) - B( I)
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(233) : Warning: This name has not been given an explicit type.   [A]
        A_MINUS_B( I) = A( I) - B( I)
------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(233) : Warning: This name has not been given an explicit type.   [B]
        A_MINUS_B( I) = A( I) - B( I)
--------------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(248) : Warning: This name has not been given an explicit type.   [NX]
      DIMENSION A( NX), B( NX)
-------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(244) : Warning: This name has not been given an explicit type.   [DOTPRODUCT]
      FUNCTION DOTPRODUCT( A, B, NX)
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(251) : Warning: This name has not been given an explicit type.   [SUM]
      SUM = 0.
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(254) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, NX
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(255) : Warning: This name has not been given an explicit type.   [A]
        SUM = SUM + A( I) * B( I)
--------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(255) : Warning: This name has not been given an explicit type.   [B]
        SUM = SUM + A( I) * B( I)
----------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(276) : Warning: This name has not been given an explicit type.   [AB]
      AB( 1) = A( 2) * B( 3) - A( 3) * B( 2)
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(276) : Warning: This name has not been given an explicit type.   [A]
      AB( 1) = A( 2) * B( 3) - A( 3) * B( 2)
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(276) : Warning: This name has not been given an explicit type.   [B]
      AB( 1) = A( 2) * B( 3) - A( 3) * B( 2)
-----------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(292) : Warning: This name has not been given an explicit type.   [NX]
      DIMENSION A_SET( NX, NY, NSET), AMAT( NX, NY)
-----------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(292) : Warning: This name has not been given an explicit type.   [NY]
      DIMENSION A_SET( NX, NY, NSET), AMAT( NX, NY)
---------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(292) : Warning: This name has not been given an explicit type.   [NSET]
      DIMENSION A_SET( NX, NY, NSET), AMAT( NX, NY)
-------------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(295) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, NX
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(296) : Warning: This name has not been given an explicit type.   [J]
        DO 998 J = 1, NY
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(297) : Warning: This name has not been given an explicit type.   [AMAT]
          AMAT( I, J) = A_SET( I, J, ISET)
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(297) : Warning: This name has not been given an explicit type.   [A_SET]
          AMAT( I, J) = A_SET( I, J, ISET)
------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(297) : Warning: This name has not been given an explicit type.   [ISET]
          AMAT( I, J) = A_SET( I, J, ISET)
-------------------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(313) : Warning: This name has not been given an explicit type.   [NX]
      DIMENSION V_SET( NX, NSET), VEC( NX)
-----------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(313) : Warning: This name has not been given an explicit type.   [NSET]
      DIMENSION V_SET( NX, NSET), VEC( NX)
---------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(316) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, NX
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(317) : Warning: This name has not been given an explicit type.   [VEC]
        VEC( I) = V_SET( I, ISET)
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(317) : Warning: This name has not been given an explicit type.   [V_SET]
        VEC( I) = V_SET( I, ISET)
------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(317) : Warning: This name has not been given an explicit type.   [ISET]
        VEC( I) = V_SET( I, ISET)
----------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(335) : Warning: This name has not been given an explicit type.   [VEC]
      VEC( 1) = X
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(335) : Warning: This name has not been given an explicit type.   [X]
      VEC( 1) = X
----------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(336) : Warning: This name has not been given an explicit type.   [Y]
      VEC( 2) = Y
----------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(337) : Warning: This name has not been given an explicit type.   [Z]
      VEC( 3) = Z
----------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(354) : Warning: This name has not been given an explicit type.   [MAXARG]
      MAXARG = 90. * AMULTIPLIER
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(354) : Warning: This name has not been given an explicit type.   [AMULTIPLIER]
      MAXARG = 90. * AMULTIPLIER
---------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(357) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 0, MAXARG
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(358) : Warning: This name has not been given an explicit type.   [ARG]
        ARG = FLOAT( I) / AMULTIPLIER
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(359) : Warning: This name has not been given an explicit type.   [COSTAB]
        COSTAB( I) = COSD( ARG)
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(360) : Warning: This name has not been given an explicit type.   [SINTAB]
        SINTAB( I) = SIND( ARG)
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(371) : Warning: This name has not been given an explicit type.   [GET_COSD]
      FUNCTION GET_COSD( ARG )
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(378) : Warning: This name has not been given an explicit type.   [A]
      A = ARG
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(378) : Warning: This name has not been given an explicit type.   [ARG]
      A = ARG
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(394) : Warning: This name has not been given an explicit type.   [ASIGN]
        ASIGN = -1.
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(400) : Warning: This name has not been given an explicit type.   [IA]
      IA = INT( A * AMULTIPLIER + .5 )
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(400) : Warning: This name has not been given an explicit type.   [AMULTIPLIER]
      IA = INT( A * AMULTIPLIER + .5 )
--------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(401) : Warning: This name has not been given an explicit type.   [COSTAB]
      GET_COSD = ASIGN * COSTAB( IA )
-------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(375) : Warning: This name has not been given an explicit type.   [SINTAB]
      COMMON /TRIGTAB/ AMULTIPLIER, COSTAB( 0:9000), SINTAB( 0:9000)
-----------------------------------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(411) : Warning: This name has not been given an explicit type.   [GET_SIND]
      FUNCTION GET_SIND( ARG )
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(418) : Warning: This name has not been given an explicit type.   [A]
      A = ARG
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(418) : Warning: This name has not been given an explicit type.   [ARG]
      A = ARG
----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(423) : Warning: This name has not been given an explicit type.   [ASIGN]
        ASIGN = -1.
--------^
C:\Tutorial\ccp4\lib\src\mthlib.for(443) : Warning: This name has not been given an explicit type.   [IA]
      IA = INT( A * AMULTIPLIER + .5 )
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(443) : Warning: This name has not been given an explicit type.   [AMULTIPLIER]
      IA = INT( A * AMULTIPLIER + .5 )
--------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(444) : Warning: This name has not been given an explicit type.   [SINTAB]
      GET_SIND = ASIGN * SINTAB( IA )
-------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(415) : Warning: This name has not been given an explicit type.   [COSTAB]
      COMMON /TRIGTAB/ AMULTIPLIER, COSTAB( 0:9000), SINTAB( 0:9000)
------------------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(454) : Warning: This name has not been given an explicit type.   [RANDOM_GAUSSIAN]
      FUNCTION RANDOM_GAUSSIAN(  NRANDOM_0_1, IRANSEED )
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(458) : Warning: This name has not been given an explicit type.   [SUM]
      SUM = 0.
------^
C:\Tutorial\ccp4\lib\src\mthlib.for(461) : Warning: This name has not been given an explicit type.   [I]
      DO 999 I = 1, NRANDOM_0_1
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(461) : Warning: This name has not been given an explicit type.   [NRANDOM_0_1]
      DO 999 I = 1, NRANDOM_0_1
--------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(462) : Warning: This name has not been given an explicit type.   [IRANSEED]
        SUM = SUM + RAN( IRANSEED ) -.5
-------------------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(476) : Warning: This name has not been given an explicit type.   [ARCTAN_DEGREES]
      FUNCTION ARCTAN_DEGREES( Y, X)
---------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(480) : Warning: This name has not been given an explicit type.   [X]
      IF ( X .EQ. 0.0 )  THEN
-----------^
C:\Tutorial\ccp4\lib\src\mthlib.for(481) : Warning: This name has not been given an explicit type.   [Y]
        IF ( Y .EQ. 0.0 )  A = 0.
-------------^
C:\Tutorial\ccp4\lib\src\mthlib.for(481) : Warning: This name has not been given an explicit type.   [A]
        IF ( Y .EQ. 0.0 )  A = 0.
---------------------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\libhtml.f"
C:\Tutorial\ccp4\lib\src\libhtml.f(137) : Warning: This name has not been given an explicit type.   [LUNSTO]
        lpt=lunsto(idum)
------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\keyparse.f"
ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\fftlib.f"
ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\ccplib.f"
C:\Tutorial\ccp4\lib\src\ccplib.f(267) : Warning: This name has not been given an explicit type.   [JA]
      EQUIVALENCE (JA,JBYT(1))
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(286) : Warning: This name has not been given an explicit type.   [NE]
      NE = NB
------^
C:\Tutorial\ccp4\lib\src\ccplib.f(286) : Warning: This name has not been given an explicit type.   [NB]
      NE = NB
-----------^
C:\Tutorial\ccp4\lib\src\ccplib.f(289) : Warning: This name has not been given an explicit type.   [I]
         DO 10 I=1,NE
---------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(363) : Warning: This name has not been given an explicit type.   [JA]
      EQUIVALENCE (JA,J2(1),JBYT(1))
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(385) : Warning: This name has not been given an explicit type.   [ISTEP]
      ISTEP = 1
------^
C:\Tutorial\ccp4\lib\src\ccplib.f(386) : Warning: This name has not been given an explicit type.   [MINEL]
      IF (MINEL.GT.MAXEL) ISTEP=-1
----------^
C:\Tutorial\ccp4\lib\src\ccplib.f(386) : Warning: This name has not been given an explicit type.   [MAXEL]
      IF (MINEL.GT.MAXEL) ISTEP=-1
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(387) : Warning: This name has not been given an explicit type.   [ITYP]
      IF (ITYP.EQ.1) THEN
----------^
C:\Tutorial\ccp4\lib\src\ccplib.f(389) : Warning: This name has not been given an explicit type.   [J]
         J=0
---------^
C:\Tutorial\ccp4\lib\src\ccplib.f(390) : Warning: This name has not been given an explicit type.   [I]
         DO 10 I=MINEL,MAXEL,ISTEP
---------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(630) : Warning: This name has not been given an explicit type.   [JA]
      EQUIVALENCE (JA,JBYT(1))
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(650) : Warning: This name has not been given an explicit type.   [N]
      JBYT(IND)=IA(N)
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(651) : Warning: This name has not been given an explicit type.   [IVAL]
      IVAL=JA
------^
C:\Tutorial\ccp4\lib\src\ccplib.f(682) : Warning: This name has not been given an explicit type.   [JA]
      EQUIVALENCE (JA,JBYT(1))
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(702) : Warning: This name has not been given an explicit type.   [N]
      JBYT(IND)=IA(N)
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(703) : Warning: This name has not been given an explicit type.   [IVAL]
      IVAL=JA
------^
C:\Tutorial\ccp4\lib\src\ccplib.f(813) : Warning: This name has not been given an explicit type.   [JA]
      EQUIVALENCE (JA,JBYT(1))
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(832) : Warning: This name has not been given an explicit type.   [NE]
      NE = NB
------^
C:\Tutorial\ccp4\lib\src\ccplib.f(832) : Warning: This name has not been given an explicit type.   [NB]
      NE = NB
-----------^
C:\Tutorial\ccp4\lib\src\ccplib.f(834) : Warning: This name has not been given an explicit type.   [I]
         DO 10 I=1,NE
---------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(882) : Warning: This name has not been given an explicit type.   [JA]
      EQUIVALENCE (JA,J2(1))
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(902) : Warning: This name has not been given an explicit type.   [I]
         DO 10 I=1,NE
---------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(902) : Warning: This name has not been given an explicit type.   [NE]
         DO 10 I=1,NE
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(1095) : Info: This variable has not been used.   [IDUM]
      LOGICAL FUNCTION CCPONL(IDUM)
------------------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(1616) : Warning: This name has not been given an explicit type.   [JA]
      EQUIVALENCE (JA,JBYT(1))
-------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(1636) : Warning: This name has not been given an explicit type.   [IVAL]
      JA=IVAL
---------^
C:\Tutorial\ccp4\lib\src\ccplib.f(1637) : Warning: This name has not been given an explicit type.   [N]
      IA(N)=JBYT(IND)
---------^
C:\Tutorial\ccp4\lib\src\ccplib.f(1965) : Warning: This name has not been given an explicit type.   [JDO]
          DO 10 JDO=1,4
----------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(1946) : Info: This variable has not been used.   [IDUM]
         LOGICAL FUNCTION LITEND(IDUM)
---------------------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2023) : Info: This variable has not been used.   [IDUM]
      FUNCTION LUNSTI(IDUM)
----------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2044) : Info: This variable has not been used.   [IDUM]
      FUNCTION LUNSTO(IDUM)
----------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2065) : Warning: This name has not been given an explicit type.   [NBITST]
      FUNCTION NBITST(IWORD,LSB,NBITS)
---------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2084) : Info: This variable has not been used.   [IVAL]
      INTEGER IWORD,LSB,NBITS,IVAL,KMSK,KVAL
------------------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2084) : Info: This variable has not been used.   [KVAL]
      INTEGER IWORD,LSB,NBITS,IVAL,KMSK,KVAL
----------------------------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2137) : Warning: This name has not been given an explicit type.   [KMSK]
      KMSK = 2**NBITS - 1
------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2137) : Warning: This name has not been given an explicit type.   [NBITS]
      KMSK = 2**NBITS - 1
----------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2138) : Warning: This name has not been given an explicit type.   [KVAL]
      KVAL = IVAL
------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2138) : Warning: This name has not been given an explicit type.   [IVAL]
      KVAL = IVAL
-------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2139) : Warning: This name has not been given an explicit type.   [LSB]
      KMSK = ISHFT(KMSK,LSB)
------------------------^
C:\Tutorial\ccp4\lib\src\ccplib.f(2142) : Warning: This name has not been given an explicit type.   [IWORD]
      IWORD = IOR(IAND(IWORD,KMSK),KVAL)
------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\cciflib.f"
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(328) : Info: This variable has not been used.   [I]
      integer i, blk_id,length_dep,angle_dep,ncntxt,istat,lenval,
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(328) : Info: This variable has not been used.   [LENGTH_DEP]
      integer i, blk_id,length_dep,angle_dep,ncntxt,istat,lenval,
------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(328) : Info: This variable has not been used.   [ANGLE_DEP]
      integer i, blk_id,length_dep,angle_dep,ncntxt,istat,lenval,
-----------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(329) : Info: This variable has not been used.   [ISTATE]
     + btype,sline,istate,IFAIL,istatus,ival,NumSpaceGroup,
-------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(333) : Info: This variable has not been used.   [ESDVAL]
      character*(cfllen) val, esdval, blknam, cval,
------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(333) : Info: This variable has not been used.   [BLKNAM]
      character*(cfllen) val, esdval, blknam, cval,
--------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(425) : Info: This variable has not been used.   [IVAL]
     & btype,sline,IFAIL,istatus,ival
---------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(518) : Info: This variable has not been used.   [IVAL]
     & btype,sline,IFAIL,istatus,ival
---------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(620) : Info: This variable has not been used.   [BLKNAM]
      character*(cfllen) val, esdval, blknam, 
--------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(864) : Info: This variable has not been used.   [NCNTXT]
      INTEGER blk_id,IFAIL1,IFAIL2,NCODE,ncntxt,istat,
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(864) : Info: This variable has not been used.   [ISTAT]
      INTEGER blk_id,IFAIL1,IFAIL2,NCODE,ncntxt,istat,
------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(865) : Info: This variable has not been used.   [BTYPE]
     & btype,sline,istate,IFAIL,istatus
-------^
C:\Tutorial\ccp4\lib\src\cciflib.f(865) : Info: This variable has not been used.   [SLINE]
     & btype,sline,istate,IFAIL,istatus
-------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(865) : Info: This variable has not been used.   [ISTATE]
     & btype,sline,istate,IFAIL,istatus
-------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(865) : Info: This variable has not been used.   [ISTATUS]
     & btype,sline,istate,IFAIL,istatus
--------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(867) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val, esdval, blknam, 
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(867) : Info: This variable has not been used.   [ESDVAL]
      character*(cfllen) val, esdval, blknam, 
------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(867) : Info: This variable has not been used.   [BLKNAM]
      character*(cfllen) val, esdval, blknam, 
--------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(868) : Info: This variable has not been used.   [MAT_ITMNAM]
     & mat_itmnam(7), mat_catnam, itmnam
-------^
C:\Tutorial\ccp4\lib\src\cciflib.f(868) : Info: This variable has not been used.   [MAT_CATNAM]
     & mat_itmnam(7), mat_catnam, itmnam
----------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(868) : Info: This variable has not been used.   [ITMNAM]
     & mat_itmnam(7), mat_catnam, itmnam
----------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(914) : Info: This variable has not been used.   [BLKNAM]
      character*(cfllen) val, blknam, 
------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1017) : Info: This variable has not been used.   [BLKNAM]
      character*(cfllen) val, blknam, 
------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1291) : Info: This variable has not been used.   [LENVAL]
      integer i, ncntxt,istat,lenval,
------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1292) : Info: This variable has not been used.   [IVAL]
     & btype,sline,istatus,ival
---------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1293) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val,cval,entity_itmnam(2),entity_catnam
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1355) : Info: This variable has not been used.   [I]
      integer i, ncntxt,istat,lenval,lenstr,
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1356) : Info: This variable has not been used.   [IVAL]
     & btype,sline,istatus,ival,nline,itmpos
---------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1448) : Info: This variable has not been used.   [IFAIL]
     & btype,sline,IFAIL
-------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1527) : Info: This variable has not been used.   [I]
      integer i, length_dep,angle_dep,ncntxt,istat,lenval,
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1527) : Info: This variable has not been used.   [LENGTH_DEP]
      integer i, length_dep,angle_dep,ncntxt,istat,lenval,
-----------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1527) : Info: This variable has not been used.   [ANGLE_DEP]
      integer i, length_dep,angle_dep,ncntxt,istat,lenval,
----------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1527) : Info: This variable has not been used.   [LENVAL]
      integer i, length_dep,angle_dep,ncntxt,istat,lenval,
---------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1528) : Info: This variable has not been used.   [ISTATE]
     + btype,sline,istate,istatus,ival,NSYMP,NSYM,NSPGP
-------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1531) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val, esdval, blknam, cval,
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1531) : Info: This variable has not been used.   [ESDVAL]
      character*(cfllen) val, esdval, blknam, cval,
------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1531) : Info: This variable has not been used.   [BLKNAM]
      character*(cfllen) val, esdval, blknam, cval,
--------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1604) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val, blknam, 
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1604) : Info: This variable has not been used.   [BLKNAM]
      character*(cfllen) val, blknam, 
------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1721) : Info: This variable has not been used.   [I]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1721) : Info: This variable has not been used.   [BTYPE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,
-------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1721) : Info: This variable has not been used.   [SLINE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1721) : Info: This variable has not been used.   [ISTATE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1723) : Info: This variable has not been used.   [ITMNAM]
      character*(cfllen) atom_site_catnam,itmnam,
------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1724) : Info: This variable has not been used.   [ATOM_SITE_ITMNAM]
     +  ATOM_SITE_ITMNAM(3)
--------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1813) : Info: This variable has not been used.   [I]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL(13),
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1813) : Info: This variable has not been used.   [ISTAT]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL(13),
------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1813) : Info: This variable has not been used.   [BTYPE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL(13),
-------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1813) : Info: This variable has not been used.   [SLINE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL(13),
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1813) : Info: This variable has not been used.   [ISTATE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL(13),
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1815) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val,esdval,atom_site_catnam,itmnam,
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1815) : Info: This variable has not been used.   [ESDVAL]
      character*(cfllen) val,esdval,atom_site_catnam,itmnam,
-----------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1815) : Info: This variable has not been used.   [ITMNAM]
      character*(cfllen) val,esdval,atom_site_catnam,itmnam,
-----------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1816) : Info: This variable has not been used.   [ATOM_SITE_ITMNAM]
     +  ATOM_SITE_ITMNAM(3),disposition
--------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1817) : Info: This variable has not been used.   [RVAL]
      REAL rval,esd
-----------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1817) : Info: This variable has not been used.   [ESD]
      REAL rval,esd
----------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1888) : Info: This variable has not been used.   [BTYPE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL,
-------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1888) : Info: This variable has not been used.   [SLINE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL,
--------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1888) : Info: This variable has not been used.   [ISTATE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL,
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1890) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val,esdval,atom_site_catnam,itmnam,
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1890) : Info: This variable has not been used.   [ESDVAL]
      character*(cfllen) val,esdval,atom_site_catnam,itmnam,
-----------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1890) : Info: This variable has not been used.   [ITMNAM]
      character*(cfllen) val,esdval,atom_site_catnam,itmnam,
-----------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1891) : Info: This variable has not been used.   [ATOM_SITE_ITMNAM]
     +  ATOM_SITE_ITMNAM(3)
--------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1892) : Info: This variable has not been used.   [RVAL]
      REAL rval,esd,xone_esu(3)
-----------^
C:\Tutorial\ccp4\lib\src\cciflib.f(1892) : Info: This variable has not been used.   [ESD]
      REAL rval,esd,xone_esu(3)
----------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2184) : Info: This variable has not been used.   [ISTATE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2186) : Info: This variable has not been used.   [ESDVAL]
      character*(cfllen) val,cval,esdval,atom_site_catnam,
----------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2188) : Info: This variable has not been used.   [RVAL]
      REAL rval,esd
-----------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2188) : Info: This variable has not been used.   [ESD]
      REAL rval,esd
----------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2316) : Info: This variable has not been used.   [I]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL,
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2631) : Info: This variable has not been used.   [I]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL,
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2708) : Info: This variable has not been used.   [ISTATE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL(3),
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2710) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val,atom_site_catnam,itmnam,
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2811) : Info: This variable has not been used.   [ISTATE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL0,
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2812) : Info: This variable has not been used.   [LENVAL]
     +  IFAIL(NITEMS),istatus,lenval,ival,ivalue(NITEMS)
------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2813) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val,cval,esdval,atom_site_catnam,
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2813) : Info: This variable has not been used.   [ESDVAL]
      character*(cfllen) val,cval,esdval,atom_site_catnam,
----------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2816) : Info: This variable has not been used.   [RVAL]
      REAL rval,esd
-----------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2816) : Info: This variable has not been used.   [ESD]
      REAL rval,esd
----------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2961) : Info: This variable has not been used.   [I]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL,
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2961) : Info: This variable has not been used.   [ISTATE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL,
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(2963) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val,atom_site_catnam,itmnam,
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(3032) : Info: This variable has not been used.   [I]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL,
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(3032) : Info: This variable has not been used.   [ISTATE]
      INTEGER I,BLK_ID,ncntxt,istat, btype, sline,istate,IFAIL,
--------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(3034) : Info: This variable has not been used.   [VAL]
      character*(cfllen) val,atom_site_catnam,itmnam,
-------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(3175) : Info: This variable has not been used.   [LENSTR]
      integer lenstr
--------------^
C:\Tutorial\ccp4\lib\src\cciflib.f(3223) : Info: This variable has not been used.   [SLINE_EXP]
      subroutine ccp4ccif_check_type(itmnam, btype_exp, sline_exp)
--------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\cciflib.fh(35) : Info: This variable has not been used.   [IFAILSTAT]
      integer ifailstat(0:5)
--------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\sorting_main.f"
C:\Tutorial\ccp4\lib\src\sorting_main.f(19) : Info: This variable has not been used.   [ISS]
      INTEGER FUNCTION SRTBEG(NKEYS,KEYBUF,NRECL,ISS)
-------------------------------------------------^
C:\Tutorial\ccp4\lib\src\sorting_main.f(199) : Info: This variable has not been used.   [I]
      INTEGER I,IR,IK
--------------^
C:\Tutorial\ccp4\lib\src\sorting_main.f(199) : Info: This variable has not been used.   [IR]
      INTEGER I,IR,IK
----------------^
C:\Tutorial\ccp4\lib\src\sorting_main.f(199) : Info: This variable has not been used.   [IK]
      INTEGER I,IR,IK
-------------------^
C:\Tutorial\ccp4\lib\src\sorting_main.f(292) : Info: This variable has not been used.   [T1_KEY]
      REAL    T_KEY(5),T1_KEY(5)
-----------------------^
C:\Tutorial\ccp4\lib\src\sorting_main.f(295) : Info: This variable has not been used.   [I_TEMP]
      INTEGER   L,M,I_TEMP,L1,MKEY1_ADD,MKEY2_ADD,I_KEY,N1
--------------------^
C:\Tutorial\ccp4\lib\src\sorting_main.f(336) : Info: This variable has not been used.   [J_KEY]
     &        I_KEY,J_KEY,I1_KEY
--------------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\rwbrook.f"
C:\Tutorial\ccp4\lib\src\rwbrook.f(108) : Warning: This name has not been given an explicit type.   [J]
        DO 40 J=I+1,4
--------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(113) : Warning: This name has not been given an explicit type.   [ROU]
          ROU(I,J)=0.0
----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(115) : Warning: This name has not been given an explicit type.   [RFU]
          RFU(I,J)=0.0
----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(202) : Warning: This name has not been given an explicit type.   [IBRKFL]
      IBRKFL=0
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(211) : Warning: This name has not been given an explicit type.   [ROU]
          ROU(I,J)=0.0
----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(213) : Warning: This name has not been given an explicit type.   [RFU]
          RFU(I,J)=0.0
----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(332) : Info: This variable has not been used.   [III]
      INTEGER IFAIL,IUNIT,ICRYST,II,III,JJ,K,ISYM
------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(332) : Info: This variable has not been used.   [JJ]
      INTEGER IFAIL,IUNIT,ICRYST,II,III,JJ,K,ISYM
----------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(332) : Info: This variable has not been used.   [K]
      INTEGER IFAIL,IUNIT,ICRYST,II,III,JJ,K,ISYM
-------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(332) : Info: This variable has not been used.   [ISYM]
      INTEGER IFAIL,IUNIT,ICRYST,II,III,JJ,K,ISYM
---------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(333) : Info: This variable has not been used.   [AM]
      REAL AM,BM,RCHK1,RCHK2,FAC
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(333) : Info: This variable has not been used.   [BM]
      REAL AM,BM,RCHK1,RCHK2,FAC
--------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(333) : Info: This variable has not been used.   [RCHK1]
      REAL AM,BM,RCHK1,RCHK2,FAC
-----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(333) : Info: This variable has not been used.   [RCHK2]
      REAL AM,BM,RCHK1,RCHK2,FAC
-----------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(343) : Info: This variable has not been used.   [NSYMCHK]
      integer  nsymchk,lspgrp,nsymppdbs,nsympdbs,ist
---------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(343) : Info: This variable has not been used.   [LSPGRP]
      integer  nsymchk,lspgrp,nsymppdbs,nsympdbs,ist
-----------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(343) : Info: This variable has not been used.   [NSYMPPDBS]
      integer  nsymchk,lspgrp,nsymppdbs,nsympdbs,ist
------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(343) : Info: This variable has not been used.   [NSYMPDBS]
      integer  nsymchk,lspgrp,nsymppdbs,nsympdbs,ist
----------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(343) : Info: This variable has not been used.   [IST]
      integer  nsymchk,lspgrp,nsymppdbs,nsympdbs,ist
-------------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(344) : Info: This variable has not been used.   [RSYMCHK]
      real rsymchk(4,4,maxsym), rsympdbs(4,4,maxsym)
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(344) : Info: This variable has not been used.   [RSYMPDBS]
      real rsymchk(4,4,maxsym), rsympdbs(4,4,maxsym)
--------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(345) : Info: This variable has not been used.   [NAMSPG_CIFS]
      character NAMSPG_CIFS*20,nampg*10
----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(345) : Info: This variable has not been used.   [NAMPG]
      character NAMSPG_CIFS*20,nampg*10
-------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(348) : Info: This variable has not been used.   [ERROR]
      REAL ERROR,VOLCHK
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(348) : Info: This variable has not been used.   [VOLCHK]
      REAL ERROR,VOLCHK
-----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(350) : Info: This variable has not been used.   [IORTH]
      INTEGER I,IORTH,IFILTYP,J,LL,ILEN,KLEN
----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(350) : Info: This variable has not been used.   [J]
      INTEGER I,IORTH,IFILTYP,J,LL,ILEN,KLEN
------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(350) : Info: This variable has not been used.   [KLEN]
      INTEGER I,IORTH,IFILTYP,J,LL,ILEN,KLEN
----------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(353) : Info: This variable has not been used.   [ORTH]
      CHARACTER*40 ORTH(6)
-------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(356) : Info: This variable has not been used.   [P]
      REAL P(4,4)
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(357) : Info: This variable has not been used.   [IEC]
      CHARACTER IEC(3)*2
----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(724) : Warning: This name has not been given an explicit type.   [ITYP]
      COMMON /RBRKXX/ IFCRYS,IFSCAL,ITYP,MATRIX,IFHDOUT,IFNEWCRYS
------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(727) : Warning: This name has not been given an explicit type.   [ROU]
      COMMON /ORTHOGU/ ROU(4,4),RFU(4,4)
-----------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(727) : Warning: This name has not been given an explicit type.   [RFU]
      COMMON /ORTHOGU/ ROU(4,4),RFU(4,4)
--------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(714) : Info: This variable has not been used.   [ITE]
      INTEGER I,II,IRET,IRE,ITE
----------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(716) : Info: This variable has not been used.   [ITYPE]
      CHARACTER*6 ITYPE(7)
------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(823) : Info: This variable has not been used.   [ITYPE]
      CHARACTER*6 ITYPE(7)
------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(831) : Info: This variable has not been used.   [U]
      REAL U(6),OCC,X,Y,Z
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(831) : Info: This variable has not been used.   [OCC]
      REAL U(6),OCC,X,Y,Z
----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(831) : Info: This variable has not been used.   [X]
      REAL U(6),OCC,X,Y,Z
--------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(831) : Info: This variable has not been used.   [Y]
      REAL U(6),OCC,X,Y,Z
----------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(831) : Info: This variable has not been used.   [Z]
      REAL U(6),OCC,X,Y,Z
------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(983) : Warning: This name has not been given an explicit type.   [OCC]
  20  CALL MMDB_F_COORD(IUNIT,XFLAG,BFLAG,X,Y,Z,OCC,BISO,U,IRET)
------------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(949) : Info: This variable has not been used.   [EIGHTPI2]
      REAL EIGHTPI2,XX,YY,ZZ
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(949) : Info: This variable has not been used.   [XX]
      REAL EIGHTPI2,XX,YY,ZZ
--------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(949) : Info: This variable has not been used.   [YY]
      REAL EIGHTPI2,XX,YY,ZZ
-----------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(949) : Info: This variable has not been used.   [ZZ]
      REAL EIGHTPI2,XX,YY,ZZ
--------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(951) : Info: This variable has not been used.   [IRESN]
      INTEGER IRESN,ISER,IZ
--------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(951) : Info: This variable has not been used.   [ISER]
      INTEGER IRESN,ISER,IZ
--------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(951) : Info: This variable has not been used.   [IZ]
      INTEGER IRESN,ISER,IZ
-------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(953) : Info: This variable has not been used.   [ATNAM]
      CHARACTER ATNAM*4,RESNAM*4,RESNO*4,ID*4,CHNNAM*1,SEGID*4
----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(953) : Info: This variable has not been used.   [RESNAM]
      CHARACTER ATNAM*4,RESNAM*4,RESNO*4,ID*4,CHNNAM*1,SEGID*4
------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(953) : Info: This variable has not been used.   [RESNO]
      CHARACTER ATNAM*4,RESNAM*4,RESNO*4,ID*4,CHNNAM*1,SEGID*4
---------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(953) : Info: This variable has not been used.   [ID]
      CHARACTER ATNAM*4,RESNAM*4,RESNO*4,ID*4,CHNNAM*1,SEGID*4
-----------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(953) : Info: This variable has not been used.   [CHNNAM]
      CHARACTER ATNAM*4,RESNAM*4,RESNO*4,ID*4,CHNNAM*1,SEGID*4
----------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(953) : Info: This variable has not been used.   [SEGID]
      CHARACTER ATNAM*4,RESNAM*4,RESNO*4,ID*4,CHNNAM*1,SEGID*4
-------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1053) : Warning: This name has not been given an explicit type.   [IRET]
   20 CALL MMDB_F_REWD(IUNIT,IRET)
-----------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1131) : Info: This variable has not been used.   [MSG1]
     *X,Y,Z,OCC,B,IZ,IOUT,MSG1,MSG2,ITER,*,*)
--------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1131) : Info: This variable has not been used.   [MSG2]
     *X,Y,Z,OCC,B,IZ,IOUT,MSG1,MSG2,ITER,*,*)
-------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1211) : Warning: This name has not been given an explicit type.   [I]
      DO 10 I=1,6
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1180) : Info: This variable has not been used.   [IS]
      SUBROUTINE WBROOK(IUNIT,ISER,ATNAM,RESNAM,CHNNAM,IRESN,IS,
-------------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1632) : Warning: This name has not been given an explicit type.   [I]
      DO 10 I=1,4
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1633) : Warning: This name has not been given an explicit type.   [J]
      DO 10 J=1,4
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1670) : Info: This variable has not been used.   [MSG]
      SUBROUTINE RBFRAC(A,B,C,AL,BE,GA,MSG)
---------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1716) : Warning: This name has not been given an explicit type.   [LCODE]
      LCODE = 0
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1717) : Warning: This name has not been given an explicit type.   [ROO]
      CALL RBRORF2(ROO,RFF,LCODE)
-------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1717) : Warning: This name has not been given an explicit type.   [RFF]
      CALL RBRORF2(ROO,RFF,LCODE)
-----------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1754) : Warning: This name has not been given an explicit type.   [ROO]
      IF(ROO(1,1) .LE.0.0000000001) THEN 
---------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1755) : Warning: This name has not been given an explicit type.   [II]
        DO 40 II=1,4
--------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1756) : Warning: This name has not been given an explicit type.   [JJ]
        DO 30 JJ=1,4
--------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1757) : Warning: This name has not been given an explicit type.   [RFF]
        RFF(II,JJ)=RF(II,JJ)
--------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1757) : Warning: This name has not been given an explicit type.   [RF]
        RFF(II,JJ)=RF(II,JJ)
-------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1758) : Warning: This name has not been given an explicit type.   [RO]
        ROO(II,JJ)=RO(II,JJ)
-------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1761) : Warning: This name has not been given an explicit type.   [LCODE]
        LCODE = NCODE
--------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1761) : Warning: This name has not been given an explicit type.   [NCODE]
        LCODE = NCODE
----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1745) : Warning: This name has not been given an explicit type.   [ITYP]
      COMMON /RBRKXX/IFCRYS,IFSCAL,ITYP,MATRIX,IFHDOUT,IFNEWCRYS
-----------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1802) : Warning: This name has not been given an explicit type.   [II]
      DO 40 II=1,4
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1803) : Warning: This name has not been given an explicit type.   [JJ]
      DO 30 JJ=1,4
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1804) : Warning: This name has not been given an explicit type.   [I]
      I=0
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1805) : Warning: This name has not been given an explicit type.   [I1]
      DO 20 I1=1,4
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1808) : Warning: This name has not been given an explicit type.   [J]
      J=0
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1809) : Warning: This name has not been given an explicit type.   [J1]
      DO 10 J1=1,4
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1815) : Warning: This name has not been given an explicit type.   [AM]
      AM=X(1,1)*X(2,2)*X(3,3)-X(1,1)*X(2,3)*X(3,2)+X(1,2)*X(2,3)*X(3,1)
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1823) : Warning: This name has not been given an explicit type.   [D]
      D=0
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1886) : Warning: This name has not been given an explicit type.   [I]
        DO I = 1,6
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1887) : Warning: This name has not been given an explicit type.   [CELL]
         CEL(I)=CELL(I)
----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1889) : Warning: This name has not been given an explicit type.   [VOL]
        VOLL = VOL
---------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1880) : Warning: This name has not been given an explicit type.   [RR]
      COMMON/RBRKZZ/CELL(6),RR(3,3,6),VOL,CELLAS(6)
----------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1880) : Warning: This name has not been given an explicit type.   [CELLAS]
      COMMON/RBRKZZ/CELL(6),RR(3,3,6),VOL,CELLAS(6)
------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1881) : Warning: This name has not been given an explicit type.   [AC]
      COMMON /RBREC/AC(6)
--------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1964) : Warning: This name has not been given an explicit type.   [CELDEL]
      CELDEL = 0.0
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(1967) : Warning: This name has not been given an explicit type.   [IWARN]
          IWARN = 0
----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2158) : Warning: This name has not been given an explicit type.   [IFLAG]
      IF(IFLAG.NE.0)GO TO 10
---------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2159) : Warning: This name has not been given an explicit type.   [XX]
      XX=RO(1,1)*X + RO(1,2)*Y +RO(1,3)*Z +RO(1,4)
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2159) : Warning: This name has not been given an explicit type.   [RO]
      XX=RO(1,1)*X + RO(1,2)*Y +RO(1,3)*Z +RO(1,4)
---------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2159) : Warning: This name has not been given an explicit type.   [X]
      XX=RO(1,1)*X + RO(1,2)*Y +RO(1,3)*Z +RO(1,4)
-----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2159) : Warning: This name has not been given an explicit type.   [Y]
      XX=RO(1,1)*X + RO(1,2)*Y +RO(1,3)*Z +RO(1,4)
-----------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2159) : Warning: This name has not been given an explicit type.   [Z]
      XX=RO(1,1)*X + RO(1,2)*Y +RO(1,3)*Z +RO(1,4)
----------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2160) : Warning: This name has not been given an explicit type.   [YY]
      YY=RO(2,1)*X + RO(2,2)*Y +RO(2,3)*Z +RO(2,4)
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2161) : Warning: This name has not been given an explicit type.   [ZZ]
      ZZ=RO(3,1)*X + RO(3,2)*Y +RO(3,3)*Z +RO(3,4)
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2163) : Warning: This name has not been given an explicit type.   [RF]
10    XX=RF(1,1)*X + RF(1,2)*Y +RF(1,3)*Z +RF(1,4)
---------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2148) : Warning: This name has not been given an explicit type.   [ITYP]
      COMMON /RBRKXX/IFCRYS,IFSCAL,ITYP,MATRIX,IFHDOUT,IFNEWCRYS
-----------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2149) : Warning: This name has not been given an explicit type.   [NCODE]
      COMMON /ORTHOG/RO(4,4),RF(4,4),NCODE
-------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2179) : Info: This variable has not been used.   [MSG]
      SUBROUTINE CVFRAC(X,Y,Z,XX,YY,ZZ,IFLAG,MSG)
---------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2315) : Warning: This name has not been given an explicit type.   [ROU]
            A(J,I)=ROU(J,I)
-------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2321) : Warning: This name has not been given an explicit type.   [RFU]
            A(J,I) = RFU(J,I)
---------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2282) : Warning: This name has not been given an explicit type.   [ITYP]
      COMMON /RBRKXX/IFCRYS,IFSCAL,ITYP,MATRIX,IFHDOUT,IFNEWCRYS
-----------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2275) : Info: This variable has not been used.   [TWOPI2]
      REAL TWOPI2
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2373) : Warning: This name has not been given an explicit type.   [I]
      DO 1 I=1,6
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2409) : Warning: This name has not been given an explicit type.   [I]
      DO 1 I=1,6
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2442) : Warning: This name has not been given an explicit type.   [LENSTR]
      ILEN = LENSTR(SPGRP)
-------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2508) : Warning: This name has not been given an explicit type.   [NAACID]
      DATA NAACID/26/
-----------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2520) : Warning: This name has not been given an explicit type.   [I]
          DO 1 I=1,NAACID
---------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2560) : Warning: This name has not been given an explicit type.   [S]
      S = 
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2561) : Warning: This name has not been given an explicit type.   [AC]
     .(AC(1)*IH*IH+AC(2)*IK*IK+AC(3)*IL*IL
-------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2561) : Warning: This name has not been given an explicit type.   [IH]
     .(AC(1)*IH*IH+AC(2)*IK*IK+AC(3)*IL*IL
-------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2561) : Warning: This name has not been given an explicit type.   [IK]
     .(AC(1)*IH*IH+AC(2)*IK*IK+AC(3)*IL*IL
-------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2561) : Warning: This name has not been given an explicit type.   [IL]
     .(AC(1)*IH*IH+AC(2)*IK*IK+AC(3)*IL*IL
-------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2641) : Warning: This name has not been given an explicit type.   [LID]
      LID = LENSTR(ID)
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2641) : Warning: This name has not been given an explicit type.   [LENSTR]
      LID = LENSTR(ID)
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2643) : Warning: This name has not been given an explicit type.   [NID]
      DO 25 NID = LID,1,-1
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2711) : Info: This variable has not been used.   [IFILFF]
      SUBROUTINE SFREAD(ID,NG,A,B,C,IWT,IELEC,CU,MO,IFAIL,IFILFF)
----------------------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2785) : Warning: This name has not been given an explicit type.   [VOL]
      COMMON /RBRKZZ/CELL(6),RR(3,3,6),VOL,CELLAS(6)
---------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2785) : Warning: This name has not been given an explicit type.   [CELLAS]
      COMMON /RBRKZZ/CELL(6),RR(3,3,6),VOL,CELLAS(6)
-------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2786) : Warning: This name has not been given an explicit type.   [ITYP]
      COMMON /RBRKXX/ IFCRYS,IFSCAL,ITYP,MATRIX,IFHDOUT,IFNEWCRYS
------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2879) : Warning: This name has not been given an explicit type.   [I]
      DO 10 I=1,FILESOPEN
------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(2865) : Info: This variable has not been used.   [OUTLIN]
      CHARACTER OUTLIN*80,ERRLIN*80
----------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(3058) : Warning: This name has not been given an explicit type.   [ILEN1]
      ILEN1 = LENSTR(SPGRP)
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(3058) : Warning: This name has not been given an explicit type.   [LENSTR]
      ILEN1 = LENSTR(SPGRP)
--------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(3059) : Warning: This name has not been given an explicit type.   [ILEN2]
      ILEN2 = LENSTR(NAMSPG_CIF)
------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(3039) : Warning: This name has not been given an explicit type.   [VOL]
      COMMON /RBRKZZ/CELL(6),RR(3,3,6),VOL,CELLAS(6)
---------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(3039) : Warning: This name has not been given an explicit type.   [CELLAS]
      COMMON /RBRKZZ/CELL(6),RR(3,3,6),VOL,CELLAS(6)
-------------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(3040) : Warning: This name has not been given an explicit type.   [ITYP]
      COMMON /RBRKXX/ IFCRYS,IFSCAL,ITYP,MATRIX,IFHDOUT,IFNEWCRYS
------------------------------------^
C:\Tutorial\ccp4\lib\src\rwbrook.f(3028) : Info: This variable has not been used.   [J]
      INTEGER I, II, J, IRET
---------------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\plotsubs.f"
ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\pxxml.f"
C:\Tutorial\ccp4\lib\src\pxxml.f(295) : Info: This variable has not been used.   [INDENT]
      integer indent
--------------^
C:\Tutorial\ccp4\lib\src\pxxml.f(391) : Warning: This name has not been given an explicit type.   [I]
      do i = elementnumber,1,-1
---------^
C:\Tutorial\ccp4\lib\src\pxxml.f(372) : Info: This variable has not been used.   [IFAIL]
      subroutine XMLCloseElement(XMLFileUnit, ElementName, ifail)
-----------------------------------------------------------^

ifort /nologo /Zi /Od /GB /include:"Debug/" /f77rtl /fpscomp:nolibs /warn:all /names:uppercase /iface:cref /module:"Debug/" /object:"Debug/" /traceback /libs:static /dbglibs /c /extfor:f /Qvc7.1 /Qlocation,link,"C:\Program Files\Microsoft Visual Studio .NET 2003\Vc7\bin" "C:\Tutorial\ccp4\lib\src\w32mvs.f"
C:\Tutorial\ccp4\lib\src\w32mvs.f(195) : Warning: This name has not been given an explicit type.   [IOS]
     +         FILE=NAMFIL,RECL=LLREC,IOSTAT=IOS,ERR=5)
---------------------------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(352) : Warning: This name has not been given an explicit type.   [ETIME]
        TLAST = ETIME (TARRAY)
----------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(491) : Info: Two-digit year return value may cause problems with the year 2000.  Use DATE_AND_TIME instead   [IDATE]
      CALL IDATE (IARRAY(1), IARRAY(2), IARRAY(3))
-----------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(664) : Warning: This name has not been given an explicit type.   [ICC]
        IF (ICC.EQ.0) THEN
------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(665) : Warning: This name has not been given an explicit type.   [IUN]
          WRITE (IUN,1004) STR
-----------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(911) : Info: This variable has not been used.   [ISTAT]
      INTEGER I, SIZES (5), POINTER (12), ISTAT
------------------------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1016) : Warning: This name has not been given an explicit type.   [KEYBD]
        entry  qdevic(keybd)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1018) : Warning: This name has not been given an explicit type.   [I0]
        entry  winope(char_dummy,i0)
---------------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1020) : Warning: This name has not been given an explicit type.   [I1]
        entry  keepas(i1,i2)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1020) : Warning: This name has not been given an explicit type.   [I2]
        entry  keepas(i1,i2)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1022) : Warning: This name has not been given an explicit type.   [I3]
        entry  draw2i(i3,i4)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1022) : Warning: This name has not been given an explicit type.   [I4]
        entry  draw2i(i3,i4)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1024) : Warning: This name has not been given an explicit type.   [I5]
        entry  move2i(i5,i6)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1024) : Warning: This name has not been given an explicit type.   [I6]
        entry  move2i(i5,i6)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1026) : Warning: This name has not been given an explicit type.   [I7]
        entry  loadma(i7)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1030) : Warning: This name has not been given an explicit type.   [I8]
        entry  mmode(i8)
---------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1034) : Warning: This name has not been given an explicit type.   [I9]
        entry  getval(i9)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1036) : Warning: This name has not been given an explicit type.   [I10]
        entry  color(i10)
---------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1038) : Warning: This name has not been given an explicit type.   [R1]
        entry  getsiz(r1,r2)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1038) : Warning: This name has not been given an explicit type.   [R2]
        entry  getsiz(r1,r2)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1042) : Warning: This name has not been given an explicit type.   [R3]
        entry  ortho2(r3,r4,r5,r6)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1042) : Warning: This name has not been given an explicit type.   [R4]
        entry  ortho2(r3,r4,r5,r6)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1042) : Warning: This name has not been given an explicit type.   [R5]
        entry  ortho2(r3,r4,r5,r6)
----------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1042) : Warning: This name has not been given an explicit type.   [R6]
        entry  ortho2(r3,r4,r5,r6)
-------------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1044) : Warning: This name has not been given an explicit type.   [R7]
        entry  getori(r7,r8)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1044) : Warning: This name has not been given an explicit type.   [R8]
        entry  getori(r7,r8)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1018) : Info: This variable has not been used.   [CHAR_DUMMY]
        entry  winope(char_dummy,i0)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1016) : Info: This variable has not been used.   [KEYBD]
        entry  qdevic(keybd)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1018) : Info: This variable has not been used.   [I0]
        entry  winope(char_dummy,i0)
---------------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1020) : Info: This variable has not been used.   [I1]
        entry  keepas(i1,i2)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1020) : Info: This variable has not been used.   [I2]
        entry  keepas(i1,i2)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1022) : Info: This variable has not been used.   [I3]
        entry  draw2i(i3,i4)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1022) : Info: This variable has not been used.   [I4]
        entry  draw2i(i3,i4)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1024) : Info: This variable has not been used.   [I5]
        entry  move2i(i5,i6)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1024) : Info: This variable has not been used.   [I6]
        entry  move2i(i5,i6)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1026) : Info: This variable has not been used.   [I7]
        entry  loadma(i7)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1030) : Info: This variable has not been used.   [I8]
        entry  mmode(i8)
---------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1034) : Info: This variable has not been used.   [I9]
        entry  getval(i9)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1036) : Info: This variable has not been used.   [I10]
        entry  color(i10)
---------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1038) : Info: This variable has not been used.   [R1]
        entry  getsiz(r1,r2)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1038) : Info: This variable has not been used.   [R2]
        entry  getsiz(r1,r2)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1042) : Info: This variable has not been used.   [R3]
        entry  ortho2(r3,r4,r5,r6)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1042) : Info: This variable has not been used.   [R4]
        entry  ortho2(r3,r4,r5,r6)
-------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1042) : Info: This variable has not been used.   [R5]
        entry  ortho2(r3,r4,r5,r6)
----------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1042) : Info: This variable has not been used.   [R6]
        entry  ortho2(r3,r4,r5,r6)
-------------------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1044) : Info: This variable has not been used.   [R7]
        entry  getori(r7,r8)
----------------------^
C:\Tutorial\ccp4\lib\src\w32mvs.f(1044) : Info: This variable has not been used.   [R8]
        entry  getori(r7,r8)
-------------------------^

Creating library...
Lib /OUT:"Debug/libccp4f.lib" /NOLOGO "Debug/parser.obj" "Debug/pack_f.obj" "Debug/modlib.obj" "Debug/lgglib.obj" "Debug/harvlib.obj" "Debug/plot84lib.obj" "Debug/dna_output.obj" "Debug/mthlib.obj" "Debug/libhtml.obj" "Debug/keyparse.obj" "Debug/fftlib.obj" "Debug/ccplib.obj" "Debug/cciflib.obj" "Debug/sorting_main.obj" "Debug/rwbrook.obj" "Debug/plotsubs.obj" "Debug/pxxml.obj" "Debug/w32mvs.obj"
xilib: executing 'lib'
lgglib.obj : warning LNK4006: _MATMULT already defined in mthlib.obj; second definition ignored


libccp4f - 0 error(s), 1419 warning(s)