Ignore:
Timestamp:
Apr 11, 2016 4:27:22 PM (7 years ago)
Author:
vondreele
Message:

find errors in stacking fortran - replace both binwin directories
principal problem - transition probability matrix transposed in G2pwd
& HW needed to be sqrt(HW)
setup a debug mode for stacking fault stuff
G2plot - comment if page.Context lines - caused problems

File:
1 edited

Legend:

Unmodified
Added
Removed
  • trunk/fsource/pydiffax.for

    r2197 r2206  
    1       SUBROUTINE PYLOADSCF(NATP,ATYPES,SFDAT)
     1      SUBROUTINE PYLOADSCF(NATP,ATYPES,SFDAT,DEBG)
    22       
    33Cf2py intent(in) NATP
     
    55Cf2py intent(in) SFDAT
    66cf2py depend(NATP) ATYPES,SFDAT
     7cf2py intent(in) DEBG
    78           
    89      INCLUDE 'DIFFaXsubs/DIFFaX.par'
     
    1213      CHARACTER*4 ATYPES(NATP)
    1314      REAL*4  SFDAT(9,NATP)
     15      LOGICAL DEBG
    1416               
    1517C fill common x-ray scattering factors
    16       debug = .FALSE.
     18      debug = DEBG
    1719      DO J=1,NATP
    1820        WRITE(atom_l(J),'(A4)') ATYPES(J)
     
    195197          l_alpha(J,I) = TRP(I,J)
    196198          DO K=1,3
    197             l_r(K,J,I) = TRX(I,J,K)
     199            l_r(K,J,I) = TRX(J,I,K)
    198200          END DO
    199201        END DO
     
    218220      EXTERNAL AGLQ16,GETSPC
    219221
    220 
    221 C      print *,n_actual,(l_n_atoms(i),i=1,n_actual)
    222 C      do j=1,n_actual
    223 C        do i=1,l_n_atoms(j)
    224 C          print *,a_name(i,j),(a_pos(k,i,j),k=1,3)
    225 C        end do
    226 C      end do
    227 c      print *, recrsv,inf_thick,xplcit,rndm,l_cnt,has_l_mirror
    228 C      do i=1,n_layers
    229 C      print *,' layer',i
    230 C         do j=1,n_layers
    231 C            print *,'layer',j,l_alpha(i,j),(l_r(k,i,j),k=1,3)
    232 C         end do
    233 C      end do
    234 c      print *,cell_a,cell_b,cell_c,cell_gamma,pnt_grp,SymGrpNo
    235 c      DoSymDump = .TRUE.
     222      DoSymDump = .FALSE.
    236223   
    237224      ok = .TRUE.
     
    239226      CALL DETUN()
    240227      CALL OPTIMZ('GSAS-II',ok)
     228      If (debug) then
     229        print *,cell_a,cell_b,cell_c,cell_gamma,pnt_grp,SymGrpNo
     230        DoSymDump = .TRUE.
     231        print *,n_actual,(l_n_atoms(i),i=1,n_actual)
     232        do j=1,n_actual
     233          do i=1,l_n_atoms(j)
     234            print *,a_name(i,j),(a_pos(k,i,j),k=1,3)
     235          end do
     236        end do
     237        do i=1,n_layers
     238        print *,' layer',i
     239           do j=1,n_layers
     240              print *,'layer',j,l_alpha(i,j),(l_r(k,i,j),k=1,3)
     241           end do
     242        end do
     243        print *, recrsv,inf_thick,xplcit,rndm,l_cnt,has_l_mirror
     244      end if
    241245       
    242246C      print *,lambda,max_angle,h_bnd,k_bnd,l_bnd,no_trials,
     
    314318      i_plane = CNTRLS(2)
    315319      l_upper = CNTRLS(3)
    316 C      print *,n_actual,(l_n_atoms(i),i=1,n_actual)
    317 C      do j=1,n_actual
    318 C        do i=1,l_n_atoms(j)
    319 C          print *,a_name(i,j),(a_pos(k,i,j),k=1,3)
    320 C        end do
    321 C      end do
    322 c      print *, recrsv,inf_thick,xplcit,rndm,l_cnt,has_l_mirror
    323 C      do i=1,n_layers
    324 C      print *,' layer',i
    325 C         do j=1,n_layers
    326 C            print *,'layer',j,l_alpha(i,j),(l_r(k,i,j),k=1,3)
    327 C         end do
    328 C      end do
     320      DoSymDump = .FALSE.
     321      if (debug) then
     322          print *,cell_a,cell_b,cell_c,cell_gamma
     323          print *,pnt_grp,SymGrpNo
     324          DoSymDump = .TRUE.
     325          print *,n_actual,(l_n_atoms(i),i=1,n_actual)
     326          do j=1,n_actual
     327            do i=1,l_n_atoms(j)
     328              print *,a_name(i,j),(a_pos(k,i,j),k=1,3)
     329            end do
     330          end do
     331          do i=1,n_layers
     332          print *,' layer',i
     333             do j=1,n_layers
     334                print *,'layer',j,l_alpha(i,j),(l_r(k,i,j),k=1,3)
     335             end do
     336          end do
     337          print *, recrsv,inf_thick,xplcit,rndm,l_cnt,has_l_mirror
     338      end if
    329339      ok = .TRUE.
    330340       
    331 c      print *,cell_a,cell_b,cell_c,cell_gamma,pnt_grp,SymGrpNo
    332 c      DoSymDump = .TRUE.
    333341      CALL SPHCST()
    334342      CALL DETUN()
Note: See TracChangeset for help on using the changeset viewer.