*$ CREATE MGDRAW.FOR *COPY MGDRAW * * *=== mgdraw ===========================================================* * * SUBROUTINE MGDRAW ( ICODE, MREG ) INCLUDE '(DBLPRC)' INCLUDE '(DIMPAR)' INCLUDE '(IOUNIT)' * *----------------------------------------------------------------------* * * * Copyright (C) 1990-2006 by Alfredo Ferrari * * All Rights Reserved. * * * * * * MaGnetic field trajectory DRAWing: actually this entry manages * * all trajectory dumping for * * drawing * * * * Created on 01 march 1990 by Alfredo Ferrari * * INFN - Milan * * Last change 05-may-06 by Alfredo Ferrari * * INFN - Milan * * * *----------------------------------------------------------------------* * INCLUDE '(CASLIM)' INCLUDE '(COMPUT)' INCLUDE '(SOURCM)' INCLUDE '(FHEAVY)' INCLUDE '(FLKSTK)' INCLUDE '(GENSTK)' INCLUDE '(MGDDCM)' INCLUDE '(PAPROP)' INCLUDE '(QUEMGD)' INCLUDE '(SUMCOU)' INCLUDE '(TRACKR)' * DIMENSION DTQUEN ( MXTRCK, MAXQMG ) * CHARACTER*20 FILNAM LOGICAL LFCOPE SAVE LFCOPE DATA LFCOPE / .FALSE. / * logical myfrst logical select(-6:39) common /results/ kpin(-6:39), kpout(-6:39), nenter, nleft * List of particles to select (Fluka ordering) * 4He, 3He, triton, deuteron, Heavy Ion, Optical Photon, Ray * proton, Anti-proton, e-, e+, nu_e, Anti-nu_e * gamma, neutron, Anti-neutron, mu+, mu-, K0L * pi+, pi-, K+, K-, Lamda, Anti-Lamda * K0S, Sigma-, Sigma+, Sigma0, pi0, K0 * Anti-K0, , nu_mu, Anti-nu_mu, , * Anti-Sigma-, Anti-Sigma0, Anti-Sigma+, Xi0, Anti-Xi0, Xi- * Xi+, Omega-, Anti-Omega data select / 7*.false. & , .true., .false., .false., .false., 2*.false. & , .true., .true., .false., .false., .false., .true. & , .false., .false., .false., .false., .false., .false. & , .false., .false., .false., .false., .false., .true. & , .true., 5*.false. & , .false., .false., .false., .false., .false., .false. & , .false., .false., .false. / data myfrst /.true./ save * *----------------------------------------------------------------------* * * * Icode = 1: call from Kaskad * * Icode = 2: call from Emfsco * * Icode = 3: call from Kasneu * * Icode = 4: call from Kashea * * Icode = 5: call from Kasoph * * * *----------------------------------------------------------------------* * * IF ( .NOT. LFCOPE ) THEN LFCOPE = .TRUE. IF ( KOMPUT .EQ. 2 ) THEN FILNAM = '/'//CFDRAW(1:8)//' DUMP A' ELSE FILNAM = CFDRAW END IF OPEN ( UNIT = IODRAW, FILE = FILNAM, STATUS = 'NEW', FORM = & 'UNFORMATTED' ) END IF c WRITE (IODRAW) NTRACK, MTRACK, JTRACK, SNGL (ETRACK), c & SNGL (WTRACK) c WRITE (IODRAW) ( SNGL (XTRACK (I)), SNGL (YTRACK (I)), c & SNGL (ZTRACK (I)), I = 0, NTRACK ), c & ( SNGL (DTRACK (I)), I = 1, MTRACK ), c & SNGL (CTRACK) * +-------------------------------------------------------------------* * | Quenching is activated IF ( LQEMGD ) THEN RULLL = ZERZER CALL QUENMG ( ICODE, MREG, RULLL, DTQUEN ) c WRITE (IODRAW) ( ( SNGL (DTQUEN (I,JBK)), I = 1, MTRACK ), c & JBK = 1, NQEMGD ) END IF * | End of quenching * +-------------------------------------------------------------------* RETURN * *======================================================================* * * * Boundary-(X)crossing DRAWing: * * * * Icode = 1x: call from Kaskad * * 19: boundary crossing * * Icode = 2x: call from Emfsco * * 29: boundary crossing * * Icode = 3x: call from Kasneu * * 39: boundary crossing * * Icode = 4x: call from Kashea * * 49: boundary crossing * * Icode = 5x: call from Kasoph * * 59: boundary crossing * * * *======================================================================* * * ENTRY BXDRAW ( ICODE, MREG, NEWREG, XSCO, YSCO, ZSCO ) if (myfrst) then nenter = 0 nleft = 0 do i=-6,39 kpin(i) = 0 kpout(i) = 0 enddo myfrst = .false. endif * if ((mreg.eq.2).and.(newreg.eq.3)) then nenter = nenter + 1 if ((jtrack.ge.-6).and.(jtrack.le.39)) & kpin(jtrack) = kpin(jtrack) + 1 endif if ((mreg.eq.3).and.(newreg.eq.2)) then nleft = nleft + 1 if ((jtrack.ge.-6).and.(jtrack.le.39)) then kpout(jtrack) = kpout(jtrack) + 1 endif 40 continue endif 50 continue RETURN * *======================================================================* * * * Event End DRAWing: * * * *======================================================================* * * ENTRY EEDRAW ( ICODE ) RETURN * *======================================================================* * * * ENergy deposition DRAWing: * * * * Icode = 1x: call from Kaskad * * 10: elastic interaction recoil * * 11: inelastic interaction recoil * * 12: stopping particle * * 13: pseudo-neutron deposition * * 14: escape * * 15: time kill * * Icode = 2x: call from Emfsco * * 20: local energy deposition (i.e. photoelectric) * * 21: below threshold, iarg=1 * * 22: below threshold, iarg=2 * * 23: escape * * 24: time kill * * Icode = 3x: call from Kasneu * * 30: target recoil * * 31: below threshold * * 32: escape * * 33: time kill * * Icode = 4x: call from Kashea * * 40: escape * * 41: time kill * * 42: delta ray stack overflow * * Icode = 5x: call from Kasoph * * 50: optical photon absorption * * 51: escape * * 52: time kill * * * *======================================================================* * * ENTRY ENDRAW ( ICODE, MREG, RULL, XSCO, YSCO, ZSCO ) IF ( .NOT. LFCOPE ) THEN LFCOPE = .TRUE. IF ( KOMPUT .EQ. 2 ) THEN FILNAM = '/'//CFDRAW(1:8)//' DUMP A' ELSE FILNAM = CFDRAW END IF OPEN ( UNIT = IODRAW, FILE = FILNAM, STATUS = 'NEW', FORM = & 'UNFORMATTED' ) END IF c WRITE (IODRAW) 0, ICODE, JTRACK, SNGL (ETRACK), SNGL (WTRACK) c WRITE (IODRAW) SNGL (XSCO), SNGL (YSCO), SNGL (ZSCO), SNGL (RULL) * +-------------------------------------------------------------------* * | Quenching is activated : calculate quenching factor * | and store quenched energy in DTQUEN(1, jbk) IF ( LQEMGD ) THEN RULLL = RULL CALL QUENMG ( ICODE, MREG, RULLL, DTQUEN ) c WRITE (IODRAW) ( SNGL (DTQUEN(1, JBK)), JBK = 1, NQEMGD ) END IF * | end quenching * +-------------------------------------------------------------------* RETURN * *======================================================================* * * * SOurce particle DRAWing: * * * *======================================================================* * ENTRY SODRAW IF ( .NOT. LFCOPE ) THEN LFCOPE = .TRUE. IF ( KOMPUT .EQ. 2 ) THEN FILNAM = '/'//CFDRAW(1:8)//' DUMP A' ELSE FILNAM = CFDRAW END IF OPEN ( UNIT = IODRAW, FILE = FILNAM, STATUS = 'NEW', FORM = & 'UNFORMATTED' ) END IF WRITE (IODRAW) -NCASE, NPFLKA, NSTMAX, SNGL (TKESUM), & SNGL (WEIPRI) * +-------------------------------------------------------------------* * | (Radioactive) isotope: it works only for 1 source particle on * | the stack for the time being IF ( ILOFLK (NPFLKA) .GE. 100000 .AND. LRADDC (NPFLKA) ) THEN IARES = MOD ( ILOFLK (NPFLKA), 100000 ) / 100 IZRES = MOD ( ILOFLK (NPFLKA), 10000000 ) / 100000 IISRES = ILOFLK (NPFLKA) / 10000000 IONID = ILOFLK (NPFLKA) c WRITE (IODRAW) ( IONID,SNGL(-TKEFLK(I)), c & SNGL (WTFLK(I)), SNGL (XFLK (I)), c & SNGL (YFLK (I)), SNGL (ZFLK (I)), c & SNGL (TXFLK(I)), SNGL (TYFLK(I)), c & SNGL (TZFLK(I)), I = 1, NPFLKA ) * | * +-------------------------------------------------------------------* * | Patch for heavy ions: it works only for 1 source particle on * | the stack for the time being ELSE IF ( ABS (ILOFLK (NPFLKA)) .GE. 10000 ) THEN IONID = ILOFLK (NPFLKA) CALL DCDION ( IONID ) c WRITE (IODRAW) ( IONID,SNGL(TKEFLK(I)+AMNHEA(-IONID)), c & SNGL (WTFLK(I)), SNGL (XFLK (I)), c & SNGL (YFLK (I)), SNGL (ZFLK (I)), c & SNGL (TXFLK(I)), SNGL (TYFLK(I)), c & SNGL (TZFLK(I)), I = 1, NPFLKA ) * | * +-------------------------------------------------------------------* * | Patch for heavy ions: ??? ELSE IF ( ILOFLK (NPFLKA) .LT. -6 ) THEN c WRITE (IODRAW) ( IONID,SNGL(TKEFLK(I)+AMNHEA(-ILOFLK(NPFLKA))), c & SNGL (WTFLK(I)), SNGL (XFLK (I)), c & SNGL (YFLK (I)), SNGL (ZFLK (I)), c & SNGL (TXFLK(I)), SNGL (TYFLK(I)), c & SNGL (TZFLK(I)), I = 1, NPFLKA ) * | * +-------------------------------------------------------------------* * | ELSE c WRITE (IODRAW) ( ILOFLK(I), SNGL (TKEFLK(I)+AM(ILOFLK(I))), c & SNGL (WTFLK(I)), SNGL (XFLK (I)), c & SNGL (YFLK (I)), SNGL (ZFLK (I)), c & SNGL (TXFLK(I)), SNGL (TYFLK(I)), c & SNGL (TZFLK(I)), I = 1, NPFLKA ) END IF * | * +-------------------------------------------------------------------* RETURN * *======================================================================* * * * USer dependent DRAWing: * * * * Icode = 10x: call from Kaskad * * 100: elastic interaction secondaries * * 101: inelastic interaction secondaries * * 102: particle decay secondaries * * 103: delta ray generation secondaries * * 104: pair production secondaries * * 105: bremsstrahlung secondaries * * 110: decay products * * Icode = 20x: call from Emfsco * * 208: bremsstrahlung secondaries * * 210: Moller secondaries * * 212: Bhabha secondaries * * 214: in-flight annihilation secondaries * * 215: annihilation at rest secondaries * * 217: pair production secondaries * * 219: Compton scattering secondaries * * 221: photoelectric secondaries * * 225: Rayleigh scattering secondaries * * Icode = 30x: call from Kasneu * * 300: interaction secondaries * * Icode = 40x: call from Kashea * * 400: delta ray generation secondaries * * For all interactions secondaries are put on GENSTK common (kp=1,np) * * but for KASHEA delta ray generation where only the secondary elec- * * tron is present and stacked on FLKSTK common for kp=npflka * * * *======================================================================* * ENTRY USDRAW ( ICODE, MREG, XSCO, YSCO, ZSCO ) IF ( .NOT. LFCOPE ) THEN LFCOPE = .TRUE. IF ( KOMPUT .EQ. 2 ) THEN FILNAM = '/'//CFDRAW(1:8)//' DUMP A' ELSE FILNAM = CFDRAW END IF OPEN ( UNIT = IODRAW, FILE = FILNAM, STATUS = 'NEW', FORM = & 'UNFORMATTED' ) END IF * No output by default: RETURN *=== End of subrutine Mgdraw ==========================================* END