SUBROUTINE aphmatph(rho, n, g0, g1, g2) ! ! interpolates dipole moment function, ! reads lower state wave function, ! determines dipole operator clebsch gordon algebra, ! combines these three elements to create inhomogeneity gamma ! ! -m. braunstein, Jan. 1991 ! USE Numeric_Kinds_Module USE FileUnits_MODULE USE Narran_Module USE TotalEng_Module USE Masses_Module USE Qall_Module USE fuzzy_MODULE USE centerho_MODULE USE Numbers_Module USE constnts_MODULE USE dip_MODULE IMPLICIT NONE INTEGER n, nrho, nmodes, i, j, maxrho, npointemp, ia, ib, ic LOGICAL little, medium REAL(Kind=WP_Kind) rhoval(21), rholast, wig, rho, rho0, rho1, rho2, sum REAL(Kind=WP_Kind) a0, a1, a2, rhop, cleb, ra, rb, rc, fact, efield REAL(Kind=WP_Kind) g0(n,n),g1(n,n),g2(n,n),dmu(nstate,nstate),psi(nstate), gamma(nstate) !-------------------------------------------------------------------- ! rho hyperpsherical radius ! n number of coupled equations ! dmu dipole moment matrix evaluated at rho. ! the dipole moment matrix is ! determined by a lagrange interpolation of w0, w1, w2. ! g0 stores dipole moment matrix at rho-0 ! g1 stores dipole moment matrix at rho-1 ! g2 stores dipole moment matrix at rho-2 ! psi wave function for lower state ! gamma inhomogeneous term !--------------------------------------------------------------------- ! start of a new sector READ in values of the dipole matrix element !--------------------------------------------------------------------- DATA little/.false./,medium/.false./ DATA rhoval/21*-1.d0/,nrho/1/ DATA rholast/-1.d0/ ! DATA wig/0.d0/ ! ! READ control ! WRITE(Out_Unit,*)'rho,rholast',rho,rholast 1 IF((rho>rhoval(nrho).AND.ABS(rho-rhoval(nrho))>fuzz) .or.ABS(rho-rholast)nrho)GOTO 1 ! rho0=rho1 ! rho1=rho2 ! rho2=rhoval(maxrho) ! DO 50 j=1,nmodes ! IF(j<=n)THEN ! DO 60 i=1,n ! g0(i,j)=g1(i,j) ! 60 g1(i,j)=g2(i,j) ! READ(tmutp_unit)(g2(i,j),i=1,n) ! ELSE ! READ(tmutp_unit) ! ENDIF ! 50 CONTINUE ! ENDIF !-------------------------------------------------------------------- ! set lagrange constants to determine electronic dipole moment at rho. !-------------------------------------------------------------------- IF(ABS(rho1-rho2)