Last Modified July 21, 2003
Proposed Root Tree Format
With the format below, the size of the tree file for one data run is
245MB (if all tracks are fit in every stream, and all events go to the
ntuple). The tree for a 100000 event geant analysis is 35 MB.
!!
!! SUBROUTINE FillHelixTree
!!------------------------------------------------------------------------------
!! FillHelixTree is the main steering subroutine for filling the
!! helix ROOT tree. Right now it works best with enablewindowbj,
!! since it takes several values from windowstat_mod, which only
!! gets filled when enablewindowbj is enabled. If the old
!! classification is being used, then everything that doesn't
!! depend on the new classification is filled, but the indices from
!! MC to data windows is not.
!!
!! This subroutine fills a Root Tree with information from data runs
!! including PACT data. This version adds info from each even window
!! with a track.
!!
!! This Root Tree can have multiple tracks per window. This has
!! required some careful thought about how to index tracks and
!! information. To avoid having too much duplicate information in
!! the ntuple, there are two sets of arrays. The window arrays, and
!! the track arrays. The window array has one entry per non-empty
!! window, and contains all the windowing information. The track
!! array has information about muon, beam positron, and decay
!! positron fits. Muons have just FG fits, beam positrons have up
!! to three fits, and decay positrons have up to two fits.
!!
!! Number of entries in each of the main arrays, and indices
!! ---------------------------------------------------------
!! Window array Number of entries: Event_nwin
!! Track array Number of entries: Event_ntr
!! MCTrack array Number of entries: Event_nmctr
!!
!! Indices from windows to tracks, tracks to windows -->
!! Window Upstream fit track index: Win_upfitindex
!! Window Downstream fit track index: Win_dnfitindex
!! Window Bothstream fit track index: Win_bothfitindex
!! MC Track index into windows: MCTrack_winidx
!!
!! Indices to fit muon, and decay positron
!! muon first guess fit index Event_imutr
!! decay positron helix fit index Event_idktr
!! muon mctrack array index Event_imumctr
!! decay positron mctrack array index Event_idkmctr
!!
!!
!! Variable in Code Root Tree Var. Description
!! ------------------------- --------------- -----------
!! ! Whole run information
!! INTEGER::nrun(in dplot) EVID_nrun ! run number
!! INTEGER::RTversion Run_treeversion ! tree version number
!! INTEGER::RTsetnum Run_michelsetnumber ! michel parameters set number
!!
!! ! Whole event information
!! INTEGER::nevt(in dplot) EVID_nevt ! event number
!! INTEGER::RTevType Event_type ! event type
!! REAL ::RTm12width Event_m12width ! m12 width
!! REAL ::RTcptime(3) Event_cptime ! capacitive probe time
!! REAL ::RTpcelost(4) Event_pcelost() ! PACT energy loss sum for PC planes 5-8
!! INTEGER::RTnMuScHits Event_nmhits ! number of muon scintillator hits
!! INTEGER::RTnwin Event_nwin ! # of non-empty windows in win array
!! INTEGER::RTnTr Event_ntr ! # of Tracks in track array
!! INTEGER::RTnMcTr Evemt_nmctr ! # of MC Tracks in track array
!! INTEGER::RTPiENuWindow Event_pienuwindow ! window of a possible pi->e nu event
!! INTEGER::RTmutrack Event_imutr ! index into track array of trigger muon window (0 if none)
!! INTEGER::RTdecaytrack Event_idktr !index into track array of trigger muon's decay window (0 if none)
!! INTEGER::RTmumctrack Event_imumctr ! index into mctrack array of trigger muon window (0 if none)
!! INTEGER::RTdecaymctrack Event_idkmctr ! index into mctrack array of trigger muon's decay window (0 if none)
!! REAL ::RTEventUser(10) Event_user() ! user array for whole event
!!
!! ! Muon scintillator hit times
!! REAL ::RTMuScTimes(15) MuSC_mtimes() ! times for muon scintillator hits
!!
!! ! Below are arrays of information by window
!! INTEGER::RTwindow(MaxWindows) Win_window ! Window for this track/fit
!! REAL ::RTwintime(MaxWindows) Win_time ! window time for track
!! INTEGER::RTwintype(MaxWindows) Win_type ! window type
!! INTEGER::RTwinnumDC(MaxWindows) Win_numdc ! number of DC hits in window
!! INTEGER::RTwinnumPC(MaxWindows) Win_numpc ! number of PC hits in window
!! INTEGER::RTwinDCmin(MaxWindows) Win_dcmin ! min plane # for DC hit in window
!! INTEGER::RTwinDCmax(MaxWindows) Win_dcmax ! max plane # for DC hit in window
!! INTEGER::RTwinPCmin(MaxWindows) Win_pcmin ! min plane # for pc hit in window
!! INTEGER::RTwinPCmax(MaxWindows) Win_pcmax ! max plane # for PC hit in window
!! REAL ::RTwinmaxUV(MaxWindows) Win_maxUV ! maximum u or v coordinate
!! REAL ::RTwinUvertex(MaxWindows) Win_uvertex ! coord of u plane at vertex (or before tgt for beam e+)
!! REAL ::RTwinVvertex(MaxWindows) Win_vvertex ! coord of v plane at vertex (or before tgt for beam e+)
!! REAL ::RTwinUpUavg(MaxWindows) Win_upuavg ! Average U coord upstream
!! REAL ::RTwinUpUsig(MaxWindows) Win_upusig ! Sigma of U coord upstream
!! REAL ::RTwinUpVavg(MaxWindows) Win_upvavg ! Average V coord upstream
!! REAL ::RTwinUpVsig(MaxWindows) Win_upvsig ! Sigma of V coord upstream
!! REAL ::RTwinUpHitsPP(MaxWindows) Win_uphitspp ! Hits per plane upstream
!! REAL ::RTwinUpClArea(MaxWindows) Win_upclusterareaavg ! Average Cluster Area upstream
!! REAL ::RTwinUpWidAvg(MaxWindows) Win_upwidthavg ! Average PC width upstream
!! REAL ::RTwinDnUavg(MaxWindows) Win_dnuavg ! Average U coord downstream
!! REAL ::RTwinDnUsig(MaxWindows) Win_dnusig ! Sigma of U coord downstream
!! REAL ::RTwinDnVavg(MaxWindows) Win_dnvavg ! Average V coord downstream
!! REAL ::RTwinDnVsig(MaxWindows) Win_dnvsig ! Sigma of V coord downstream
!! REAL ::RTwinDnHitsPP(MaxWindows) Win_dnhitspp ! Hits per plane downstream
!! REAL ::RTwinDnClArea(MaxWindows) Win_dnclusterareaavg ! Average Cluster Area downstream
!! REAL ::RTwinDnWidAvg(MaxWindows) Win_dnwidthavg ! Average PC width downstream
!! REAL ::RTtof(MaxWindows) Win_pctof ! time of flight from PC averages
!! REAL ::RTpctsig(MaxWindows) Win_pctsig ! sigma of times for PC hits in window
!! INTEGER::RTUpFitIdx(MaxWindows) Win_upfitidx ! Index into fit tracks for US fit in window
!! INTEGER::RTDnFitIdx(MaxWindows) Win_dnfitidx ! Index into fit tracks for DS fit in window
!! INTEGER::RTBothFitIdx(MaxWindows) Win_bothfitidx ! Index into fit tracks for BS fit in window
!! REAL ::RTWinUser1(MaxWindows) Win_user1 ! User variable 1 for window
!! REAL ::RTWinUser2(MaxWindows) Win_user2 ! User variable 2 for window
!! REAL ::RTWinUser3(MaxWindows) Win_user3 ! User variable 3 for window
!! REAL ::RTWinUser4(MaxWindows) Win_user4 ! User variable 4 for window
!!
!! ! Below are arrays of information by track
!! INTEGER::RTWinIdx(MaxTracks) Track_winidx ! Index into window arrays for this track fit
!! INTEGER::RTstream(MaxTracks) Track_stream ! Stream for this track/fit
!! INTEGER::RTfitnumU(MaxTracks) Track_numu ! # of DC u hits used in track fit
!! INTEGER::RTfitnumV(MaxTracks) Track_numv ! # of DC v hits used in track fit
!! INTEGER::RTfitDCmin(MaxTracks) Track_dcmin ! min plane # for DC hit for track fit
!! INTEGER::RTfitDCmax(MaxTracks) Track_dcmax ! max plane # for DC hit for track fit
!! REAL ::RTfittgtu(MaxTracks) Track_uvertex ! u,v coord of fit proj to foil after
!! REAL ::RTfittgtv(MaxTracks) Track_vvertex ! muon last plane hit (or tgt for beam e+)
!! REAL ::RTptot(MaxTracks) Track_ptot ! total momentum for track fit
!! REAL ::RTcosth(MaxTracks) Track_costh ! cosine theta for track fit
!! REAL ::RTphi(MaxTracks) Track_phimuv ! phi(of momentum) for track fit
!! REAL ::RTtime(MaxTracks) Track_time ! time for track fit
!! REAL ::RTchi2(MaxTracks) Track_chi2 ! chi-squared for track fit
!! INTEGER::RTndof(MaxTracks) Track_ndof ! # of degrees of freedom
!! REAL ::RTconlev(MaxTracks) Track_conlev ! confidence level for track fit
!! INTEGER::RTq(MaxTracks) Track_q ! charge for track fit
!! INTEGER::RTierror(MaxTracks) Track_ierror ! status code for track fit
!! INTEGER::RTFGierror(MaxTracks) Track_fgierror ! status code for firstguess
!! REAL ::RTTrackUser1(MaxTracks) Track_user1 ! user variable 1 for track
!! REAL ::RTTrackUser2(MaxTracks) Track_user2 ! user variable 2 for track
!! REAL ::RTTrackUser3(MaxTracks) Track_user3 ! user variable 3 for track
!! REAL ::RTTrackUser4(MaxTracks) Track_user4 ! user variable 4 for track
!!
!! ! Below are arrays of information by MC track
!! real :: RTmcitrack(MaxTracks) MCTrack_itrack ! MC itrack index
!! real :: RTmcptot(MaxTracks) MCTrack_ptot ! MC total momentum
!! real :: RTmccosth(MaxTracks) MCTrack_costh ! MC cos theta
!! real :: RTmcphi(MaxTracks) MCTrack_phimuv ! MC phi for mu+
!! real :: RTmctime(MaxTracks) MCTrack_time ! MC time for mu+
!! real :: RTmcvu(MaxTracks) MCTrack_vu ! MC starting x vertex
!! real :: RTmcvv(MaxTracks) MCTrack_vv ! MC starting y vertex
!! real :: RTmcvz(MaxTracks) MCTrack_vz ! MC starting z vertex
!! integer:: RTmcpid(MaxTracks) MCTrack_pid ! MC particle type
!! integer:: RTmcwidx(MaxTracks) MCTrack_winidx ! Guess at index into window array
!! integer:: RTmcminP(MaxTracks) MCTrack_minp ! Minimum plane number hit
!! integer:: RTmcmaxP(MaxTracks) MCTrack_maxp ! Maximum plane number hit
!! integer:: RTmcturnaround(MaxTracks) MCTrack_turnaround ! Did track turn around anywhere
!! integer:: RTmcothersidedelta(MaxTracks) MCTrack_othersidedelta ! Delta goes past track stopz?
!! integer:: RTMCTrackUser1(MaxTracks) MCTrack_user1 ! user variable 1 for mc track
!! integer:: RTMCTrackUser2(MaxTracks) MCTrack_user2 ! user variable 2 for mc track
!! integer:: RTMCTrackUser3(MaxTracks) MCTrack_user3 ! user variable 3 for mc track
!! integer:: RTMCTrackUser4(MaxTracks) MCTrack_user4 ! user variable 4 for mc track
!!
!! ! MC Black Box number
!! integer::spectrum MCSet_spectrum ! MC Micheld spectrum number
!! integer::sample MCSet_sample ! MC Micheld sample number
!! integer::numMicheldDecays MCSet_ndecays ! number of micheld decays
!!
!! ! MC derivative flags
!! integer::micheldItrack(kMaxMicheldDecays) MichelD_itrack ! MC itrack index
!! integer::micheldAccFlag(kMaxMicheldDecays) MichelD_accflag ! Derivative flag for each micheld decay
!!
!!------------------------------------------------------------------------------------------------------
!! Author: Blair Jamieson
!! Date: June 2003
!!
Back to Analysis Plans.