Errno 2

Asked by Boudinar Fatima

Hi
I'm trying to generate the process p p > e+ ve [QCD] at NLO with MG5_aMC_v2_3_3 and i'm getting the folowing error messeg
Command "launch auto " interrupted with error:
IOError : [Errno 2] No such file or directory: '/home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/SubProcesses/P0_udx_epve/check_poles.log'
Please report this bug on https://bugs.launchpad.net/madgraph5
More information is found in '/home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/run_01_tag_1_debug.log'.
Please attach this file to your report.
please Help.
regards.

Question information

Language:
English Edit question
Status:
Answered
For:
MadGraph5_aMC@NLO Edit question
Assignee:
marco zaro Edit question
Last query:
Last reply:
Revision history for this message
marco zaro (marco-zaro) said :
#1

Dear Fatima,
are you changing any parameter with respect to the default values?
If you go inside /home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/SubProcesses/P0_udx_epve/
is there a file called check_poles?
if not, can you tell me what error is given by
make check_poles?

if yes, what happens issuing in that dir the command
./check_poles < ../../check_poles_input.txt?

Thanks
Cheers,

Marco

Revision history for this message
Boudinar Fatima (fatima17) said :
#2

Hi;
I'm not changing any parameter with respect to the default values, and when
i go inside /home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/SubProcesses/P0_udx_epve/
i find the following chek_poles:
Program DRIVER
c**************************************************************************
c This is the driver for the whole calulation
c**************************************************************************
      implicit none
C
C CONSTANTS
C
      double precision pi, zero
      parameter (pi=3.1415926535897932385d0)
      parameter (zero = 0d0)
      integer npoints, npointsChecked
      integer i, j, k
      integer return_code
      double precision tolerance, tolerance_default
      double precision, allocatable :: accuracies(:)
      double precision accuracy
      double precision ren_scale, energy
      include 'genps.inc'
      include 'nexternal.inc'
      include 'nFKSconfigs.inc'
      double precision p(0:3, nexternal), prambo(0:3, nexternal)
      double precision p_born(0:3,nexternal-1)
      common/pborn/p_born
      double precision pswgt
      double precision fks_double, fks_single
      double precision, allocatable :: virt_wgts(:,:)
      double precision double, single, finite
      double complex born(2)
      double precision totmass
      logical calculatedborn
      common/ccalculatedborn/calculatedborn
      logical fksprefact
      parameter (fksprefact=.true.)
      integer nfksprocess
      common/c_nfksprocess/nfksprocess
      double precision fkssymmetryfactor,fkssymmetryfactorBorn,
     & fkssymmetryfactorDeg
      integer ngluons,nquarks(-6:6)
      common/numberofparticles/fkssymmetryfactor,fkssymmetryfactorBorn,
     & fkssymmetryfactorDeg,ngluons,nquarks
      integer fks_j_from_i(nexternal,0:nexternal)
     & ,particle_type(nexternal),pdg_type(nexternal)
      common /c_fks_inc/fks_j_from_i,particle_type,pdg_type
      integer i_fks,j_fks
      common/fks_indices/i_fks,j_fks
cc
      include 'run.inc'
      include 'coupl.inc'
      include 'q_es.inc'
      integer nsqso
      double precision pmass(nexternal), pmass_rambo(nexternal)
      integer nfail
      logical first_time
      data first_time/.TRUE./
      include 'FKSParams.inc'

C-----
C BEGIN CODE
C-----
      if (first_time) then
          call get_nsqso_loop(nsqso)
          allocate(virt_wgts(0:3,0:nsqso))
          allocate(accuracies(0:nsqso))
          first_time = .false.
      endif

      call setrun !Sets up run parameters
      call setpara('param_card.dat') !Sets up couplings and masses
      call setcuts !Sets up cuts and particle masses
      call printout !Prints out a summary of paramaters
      call run_printout !Prints out a summary of the run settings
      include 'pmass.inc'

      call FKSParamReader('FKS_params.dat',.TRUE.,.FALSE.)
      tolerance_default = IRPoleCheckThreshold

c Set the energy to be characteristic of the run
      totmass = 0.0d0
      do i=1,nexternal
        totmass = totmass + pmass(i)
      enddo
      energy = max((ebeam(1)+ebeam(2))/20.0d0,2.0d0*totmass)
c Set the renormalization scale to be of the order of sqrt(s) but
c not equal to it so as to be sensitive to all logs in the check.
      ren_scale = energy/2.0d0

      write(*,*)' Insert the number of points to test'
      read(*,*) npoints
      write(*,*)'Insert the relative tolerance'
      write(*,*)' A negative number will mean use the default one: ',
     1 tolerance_default
      read(*,*) tolerance
      if (tolerance .le. zero) tolerance = tolerance_default

      mu_r = ren_scale
      qes2 = ren_scale**2

      do i = nincoming+1, nexternal-1
          pmass_rambo(i-nincoming) = pmass(i)
      enddo

c Find the nFKSprocess for which we compute the Born-like contributions,
c ie. which is a Born+g real-emission process
      do nFKSprocess=1,fks_configs
         call fks_inc_chooser()
         if (particle_type(i_fks).eq.8) exit
      enddo
      call fks_inc_chooser()
      call leshouche_inc_chooser()
      call setfksfactor(1,.false.)

      nfail = 0
      npointsChecked = 0

c Make sure that stability checks are always used by MadLoop, even for
c initialization
      CALL FORCE_STABILITY_CHECK(.TRUE.)

200 continue
          calculatedborn = .false.
          if (nincoming.eq.1) then
              call rambo(0, nexternal-nincoming-1, pmass(1),
     1 pmass_rambo, prambo)
              p_born(0,1) = pmass(1)
              p_born(1,1) = 0d0
              p_born(2,1) = 0d0
              p_born(3,1) = 0d0
          elseif (nincoming.eq.2) then
              if (nexternal - nincoming - 1 .eq.1) then
                  ! deal with the case of only one particle in the final
                  ! state
                  p_born(0,1) = pmass(3)/2d0
                  p_born(1,1) = 0d0
                  p_born(2,1) = 0d0
                  p_born(3,1) = pmass(3)/2d0
                  if (pmass(1) > 0d0)
     1 p_born(3,1) = dsqrt(pmass(3)**2/4d0 - pmass(1)**2)
                  p_born(0,2) = pmass(3)/2d0
                  p_born(1,2) = 0d0
                  p_born(2,2) = 0d0
                  p_born(3,2) = -pmass(3)/2d0
                  if (pmass(2) > 0d0)
     1 p_born(3,2) = -dsqrt(pmass(3)**2/4d0 - pmass(1)**2)

                  prambo(0,1) = pmass(3)
                  prambo(1,1) = 0d0
                  prambo(2,1) = 0d0
                  prambo(3,1) = 0d0

              else
the error giving by make check_poles is:
Command "make" not recognized, please try again.

2017-05-02 12:22 GMT+02:00 marco zaro <email address hidden>
:

> Your question #630425 on MadGraph5_aMC@NLO changed:
> https://answers.launchpad.net/mg5amcnlo/+question/630425
>
> Status: Open => Needs information
>
> marco zaro requested more information:
> Dear Fatima,
> are you changing any parameter with respect to the default values?
> If you go inside /home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/
> SubProcesses/P0_udx_epve/
> is there a file called check_poles?
> if not, can you tell me what error is given by
> make check_poles?
>
> if yes, what happens issuing in that dir the command
> ./check_poles < ../../check_poles_input.txt?
>
> Thanks
> Cheers,
>
> Marco
>
> --
> To answer this request for more information, you can either reply to
> this email or enter your reply at the following page:
> https://answers.launchpad.net/mg5amcnlo/+question/630425
>
> You received this question notification because you asked the question.
>

Revision history for this message
marco zaro (marco-zaro) said :
#3

so the problem is that ‘make’ does not work as a command, right?
what operating system are you using?

Cheers,

Marco

On 02 May 2017, at 19:58, Boudinar Fatima <email address hidden> wrote:

> Question #630425 on MadGraph5_aMC@NLO changed:
> https://answers.launchpad.net/mg5amcnlo/+question/630425
>
> Status: Needs information => Open
>
> Boudinar Fatima gave more information on the question:
> Hi;
> I'm not changing any parameter with respect to the default values, and when
> i go inside /home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/SubProcesses/P0_udx_epve/
> i find the following chek_poles:
> Program DRIVER
> c**************************************************************************
> c This is the driver for the whole calulation
> c**************************************************************************
> implicit none
> C
> C CONSTANTS
> C
> double precision pi, zero
> parameter (pi=3.1415926535897932385d0)
> parameter (zero = 0d0)
> integer npoints, npointsChecked
> integer i, j, k
> integer return_code
> double precision tolerance, tolerance_default
> double precision, allocatable :: accuracies(:)
> double precision accuracy
> double precision ren_scale, energy
> include 'genps.inc'
> include 'nexternal.inc'
> include 'nFKSconfigs.inc'
> double precision p(0:3, nexternal), prambo(0:3, nexternal)
> double precision p_born(0:3,nexternal-1)
> common/pborn/p_born
> double precision pswgt
> double precision fks_double, fks_single
> double precision, allocatable :: virt_wgts(:,:)
> double precision double, single, finite
> double complex born(2)
> double precision totmass
> logical calculatedborn
> common/ccalculatedborn/calculatedborn
> logical fksprefact
> parameter (fksprefact=.true.)
> integer nfksprocess
> common/c_nfksprocess/nfksprocess
> double precision fkssymmetryfactor,fkssymmetryfactorBorn,
> & fkssymmetryfactorDeg
> integer ngluons,nquarks(-6:6)
> common/numberofparticles/fkssymmetryfactor,fkssymmetryfactorBorn,
> & fkssymmetryfactorDeg,ngluons,nquarks
> integer fks_j_from_i(nexternal,0:nexternal)
> & ,particle_type(nexternal),pdg_type(nexternal)
> common /c_fks_inc/fks_j_from_i,particle_type,pdg_type
> integer i_fks,j_fks
> common/fks_indices/i_fks,j_fks
> cc
> include 'run.inc'
> include 'coupl.inc'
> include 'q_es.inc'
> integer nsqso
> double precision pmass(nexternal), pmass_rambo(nexternal)
> integer nfail
> logical first_time
> data first_time/.TRUE./
> include 'FKSParams.inc'
>
> C-----
> C BEGIN CODE
> C-----
> if (first_time) then
> call get_nsqso_loop(nsqso)
> allocate(virt_wgts(0:3,0:nsqso))
> allocate(accuracies(0:nsqso))
> first_time = .false.
> endif
>
> call setrun !Sets up run parameters
> call setpara('param_card.dat') !Sets up couplings and masses
> call setcuts !Sets up cuts and particle masses
> call printout !Prints out a summary of paramaters
> call run_printout !Prints out a summary of the run settings
> include 'pmass.inc'
>
> call FKSParamReader('FKS_params.dat',.TRUE.,.FALSE.)
> tolerance_default = IRPoleCheckThreshold
>
> c Set the energy to be characteristic of the run
> totmass = 0.0d0
> do i=1,nexternal
> totmass = totmass + pmass(i)
> enddo
> energy = max((ebeam(1)+ebeam(2))/20.0d0,2.0d0*totmass)
> c Set the renormalization scale to be of the order of sqrt(s) but
> c not equal to it so as to be sensitive to all logs in the check.
> ren_scale = energy/2.0d0
>
> write(*,*)' Insert the number of points to test'
> read(*,*) npoints
> write(*,*)'Insert the relative tolerance'
> write(*,*)' A negative number will mean use the default one: ',
> 1 tolerance_default
> read(*,*) tolerance
> if (tolerance .le. zero) tolerance = tolerance_default
>
> mu_r = ren_scale
> qes2 = ren_scale**2
>
> do i = nincoming+1, nexternal-1
> pmass_rambo(i-nincoming) = pmass(i)
> enddo
>
> c Find the nFKSprocess for which we compute the Born-like contributions,
> c ie. which is a Born+g real-emission process
> do nFKSprocess=1,fks_configs
> call fks_inc_chooser()
> if (particle_type(i_fks).eq.8) exit
> enddo
> call fks_inc_chooser()
> call leshouche_inc_chooser()
> call setfksfactor(1,.false.)
>
> nfail = 0
> npointsChecked = 0
>
> c Make sure that stability checks are always used by MadLoop, even for
> c initialization
> CALL FORCE_STABILITY_CHECK(.TRUE.)
>
> 200 continue
> calculatedborn = .false.
> if (nincoming.eq.1) then
> call rambo(0, nexternal-nincoming-1, pmass(1),
> 1 pmass_rambo, prambo)
> p_born(0,1) = pmass(1)
> p_born(1,1) = 0d0
> p_born(2,1) = 0d0
> p_born(3,1) = 0d0
> elseif (nincoming.eq.2) then
> if (nexternal - nincoming - 1 .eq.1) then
> ! deal with the case of only one particle in the final
> ! state
> p_born(0,1) = pmass(3)/2d0
> p_born(1,1) = 0d0
> p_born(2,1) = 0d0
> p_born(3,1) = pmass(3)/2d0
> if (pmass(1) > 0d0)
> 1 p_born(3,1) = dsqrt(pmass(3)**2/4d0 - pmass(1)**2)
> p_born(0,2) = pmass(3)/2d0
> p_born(1,2) = 0d0
> p_born(2,2) = 0d0
> p_born(3,2) = -pmass(3)/2d0
> if (pmass(2) > 0d0)
> 1 p_born(3,2) = -dsqrt(pmass(3)**2/4d0 - pmass(1)**2)
>
> prambo(0,1) = pmass(3)
> prambo(1,1) = 0d0
> prambo(2,1) = 0d0
> prambo(3,1) = 0d0
>
> else
> the error giving by make check_poles is:
> Command "make" not recognized, please try again.
>
>
> 2017-05-02 12:22 GMT+02:00 marco zaro <email address hidden>
> :
>
>> Your question #630425 on MadGraph5_aMC@NLO changed:
>> https://answers.launchpad.net/mg5amcnlo/+question/630425
>>
>> Status: Open => Needs information
>>
>> marco zaro requested more information:
>> Dear Fatima,
>> are you changing any parameter with respect to the default values?
>> If you go inside /home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/
>> SubProcesses/P0_udx_epve/
>> is there a file called check_poles?
>> if not, can you tell me what error is given by
>> make check_poles?
>>
>> if yes, what happens issuing in that dir the command
>> ./check_poles < ../../check_poles_input.txt?
>>
>> Thanks
>> Cheers,
>>
>> Marco
>>
>> --
>> To answer this request for more information, you can either reply to
>> this email or enter your reply at the following page:
>> https://answers.launchpad.net/mg5amcnlo/+question/630425
>>
>> You received this question notification because you asked the question.
>>
>
> --
> You received this question notification because you are assigned to this
> question.

Revision history for this message
Boudinar Fatima (fatima17) said :
#4

Hi;
the operating system that i'm using is Ubuntu 14.04

2017-05-03 9:53 GMT+02:00 marco zaro <email address hidden>:

> Your question #630425 on MadGraph5_aMC@NLO changed:
> https://answers.launchpad.net/mg5amcnlo/+question/630425
>
> Status: Open => Answered
>
> marco zaro proposed the following answer:
> so the problem is that ‘make’ does not work as a command, right?
> what operating system are you using?
>
> Cheers,
>
> Marco
>
> On 02 May 2017, at 19:58, Boudinar Fatima
> <email address hidden> wrote:
>
> > Question #630425 on MadGraph5_aMC@NLO changed:
> > https://answers.launchpad.net/mg5amcnlo/+question/630425
> >
> > Status: Needs information => Open
> >
> > Boudinar Fatima gave more information on the question:
> > Hi;
> > I'm not changing any parameter with respect to the default values, and
> when
> > i go inside /home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/
> SubProcesses/P0_udx_epve/
> > i find the following chek_poles:
> > Program DRIVER
> > c***********************************************************
> ***************
> > c This is the driver for the whole calulation
> > c***********************************************************
> ***************
> > implicit none
> > C
> > C CONSTANTS
> > C
> > double precision pi, zero
> > parameter (pi=3.1415926535897932385d0)
> > parameter (zero = 0d0)
> > integer npoints, npointsChecked
> > integer i, j, k
> > integer return_code
> > double precision tolerance, tolerance_default
> > double precision, allocatable :: accuracies(:)
> > double precision accuracy
> > double precision ren_scale, energy
> > include 'genps.inc'
> > include 'nexternal.inc'
> > include 'nFKSconfigs.inc'
> > double precision p(0:3, nexternal), prambo(0:3, nexternal)
> > double precision p_born(0:3,nexternal-1)
> > common/pborn/p_born
> > double precision pswgt
> > double precision fks_double, fks_single
> > double precision, allocatable :: virt_wgts(:,:)
> > double precision double, single, finite
> > double complex born(2)
> > double precision totmass
> > logical calculatedborn
> > common/ccalculatedborn/calculatedborn
> > logical fksprefact
> > parameter (fksprefact=.true.)
> > integer nfksprocess
> > common/c_nfksprocess/nfksprocess
> > double precision fkssymmetryfactor,fkssymmetryfactorBorn,
> > & fkssymmetryfactorDeg
> > integer ngluons,nquarks(-6:6)
> > common/numberofparticles/fkssymmetryfactor,fkssymmetryfactorBorn,
> > & fkssymmetryfactorDeg,ngluons,nquarks
> > integer fks_j_from_i(nexternal,0:nexternal)
> > & ,particle_type(nexternal),pdg_type(nexternal)
> > common /c_fks_inc/fks_j_from_i,particle_type,pdg_type
> > integer i_fks,j_fks
> > common/fks_indices/i_fks,j_fks
> > cc
> > include 'run.inc'
> > include 'coupl.inc'
> > include 'q_es.inc'
> > integer nsqso
> > double precision pmass(nexternal), pmass_rambo(nexternal)
> > integer nfail
> > logical first_time
> > data first_time/.TRUE./
> > include 'FKSParams.inc'
> >
> > C-----
> > C BEGIN CODE
> > C-----
> > if (first_time) then
> > call get_nsqso_loop(nsqso)
> > allocate(virt_wgts(0:3,0:nsqso))
> > allocate(accuracies(0:nsqso))
> > first_time = .false.
> > endif
> >
> > call setrun !Sets up run parameters
> > call setpara('param_card.dat') !Sets up couplings and masses
> > call setcuts !Sets up cuts and particle masses
> > call printout !Prints out a summary of paramaters
> > call run_printout !Prints out a summary of the run settings
> > include 'pmass.inc'
> >
> > call FKSParamReader('FKS_params.dat',.TRUE.,.FALSE.)
> > tolerance_default = IRPoleCheckThreshold
> >
> > c Set the energy to be characteristic of the run
> > totmass = 0.0d0
> > do i=1,nexternal
> > totmass = totmass + pmass(i)
> > enddo
> > energy = max((ebeam(1)+ebeam(2))/20.0d0,2.0d0*totmass)
> > c Set the renormalization scale to be of the order of sqrt(s) but
> > c not equal to it so as to be sensitive to all logs in the check.
> > ren_scale = energy/2.0d0
> >
> > write(*,*)' Insert the number of points to test'
> > read(*,*) npoints
> > write(*,*)'Insert the relative tolerance'
> > write(*,*)' A negative number will mean use the default one: ',
> > 1 tolerance_default
> > read(*,*) tolerance
> > if (tolerance .le. zero) tolerance = tolerance_default
> >
> > mu_r = ren_scale
> > qes2 = ren_scale**2
> >
> > do i = nincoming+1, nexternal-1
> > pmass_rambo(i-nincoming) = pmass(i)
> > enddo
> >
> > c Find the nFKSprocess for which we compute the Born-like contributions,
> > c ie. which is a Born+g real-emission process
> > do nFKSprocess=1,fks_configs
> > call fks_inc_chooser()
> > if (particle_type(i_fks).eq.8) exit
> > enddo
> > call fks_inc_chooser()
> > call leshouche_inc_chooser()
> > call setfksfactor(1,.false.)
> >
> > nfail = 0
> > npointsChecked = 0
> >
> > c Make sure that stability checks are always used by MadLoop, even for
> > c initialization
> > CALL FORCE_STABILITY_CHECK(.TRUE.)
> >
> > 200 continue
> > calculatedborn = .false.
> > if (nincoming.eq.1) then
> > call rambo(0, nexternal-nincoming-1, pmass(1),
> > 1 pmass_rambo, prambo)
> > p_born(0,1) = pmass(1)
> > p_born(1,1) = 0d0
> > p_born(2,1) = 0d0
> > p_born(3,1) = 0d0
> > elseif (nincoming.eq.2) then
> > if (nexternal - nincoming - 1 .eq.1) then
> > ! deal with the case of only one particle in the final
> > ! state
> > p_born(0,1) = pmass(3)/2d0
> > p_born(1,1) = 0d0
> > p_born(2,1) = 0d0
> > p_born(3,1) = pmass(3)/2d0
> > if (pmass(1) > 0d0)
> > 1 p_born(3,1) = dsqrt(pmass(3)**2/4d0 - pmass(1)**2)
> > p_born(0,2) = pmass(3)/2d0
> > p_born(1,2) = 0d0
> > p_born(2,2) = 0d0
> > p_born(3,2) = -pmass(3)/2d0
> > if (pmass(2) > 0d0)
> > 1 p_born(3,2) = -dsqrt(pmass(3)**2/4d0 - pmass(1)**2)
> >
> > prambo(0,1) = pmass(3)
> > prambo(1,1) = 0d0
> > prambo(2,1) = 0d0
> > prambo(3,1) = 0d0
> >
> > else
> > the error giving by make check_poles is:
> > Command "make" not recognized, please try again.
> >
> >
> > 2017-05-02 12:22 GMT+02:00 marco zaro <question630425@answers.
> launchpad.net>
> > :
> >
> >> Your question #630425 on MadGraph5_aMC@NLO changed:
> >> https://answers.launchpad.net/mg5amcnlo/+question/630425
> >>
> >> Status: Open => Needs information
> >>
> >> marco zaro requested more information:
> >> Dear Fatima,
> >> are you changing any parameter with respect to the default values?
> >> If you go inside /home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/
> >> SubProcesses/P0_udx_epve/
> >> is there a file called check_poles?
> >> if not, can you tell me what error is given by
> >> make check_poles?
> >>
> >> if yes, what happens issuing in that dir the command
> >> ./check_poles < ../../check_poles_input.txt?
> >>
> >> Thanks
> >> Cheers,
> >>
> >> Marco
> >>
> >> --
> >> To answer this request for more information, you can either reply to
> >> this email or enter your reply at the following page:
> >> https://answers.launchpad.net/mg5amcnlo/+question/630425
> >>
> >> You received this question notification because you asked the question.
> >>
> >
> > --
> > You received this question notification because you are assigned to this
> > question.
>
> --
> If this answers your question, please go to the following page to let us
> know that it is solved:
> https://answers.launchpad.net/mg5amcnlo/+question/630425/+
> confirm?answer_id=2
>
> If you still need help, you can reply to this email or go to the
> following page to enter your feedback:
> https://answers.launchpad.net/mg5amcnlo/+question/630425
>
> You received this question notification because you asked the question.
>

Revision history for this message
marco zaro (marco-zaro) said :
#5

ok, but, does the ‘make’ command work?
if not, you need to install the build-essential package
sudo apt-get install build-essential
Cheers,

Marco
On 09 May 2017, at 15:18, Boudinar Fatima <email address hidden> wrote:

> Question #630425 on MadGraph5_aMC@NLO changed:
> https://answers.launchpad.net/mg5amcnlo/+question/630425
>
> Status: Answered => Open
>
> Boudinar Fatima is still having a problem:
> Hi;
> the operating system that i'm using is Ubuntu 14.04
>
> 2017-05-03 9:53 GMT+02:00 marco zaro
> <email address hidden>:
>
>> Your question #630425 on MadGraph5_aMC@NLO changed:
>> https://answers.launchpad.net/mg5amcnlo/+question/630425
>>
>> Status: Open => Answered
>>
>> marco zaro proposed the following answer:
>> so the problem is that ‘make’ does not work as a command, right?
>> what operating system are you using?
>>
>> Cheers,
>>
>> Marco
>>
>> On 02 May 2017, at 19:58, Boudinar Fatima
>> <email address hidden> wrote:
>>
>>> Question #630425 on MadGraph5_aMC@NLO changed:
>>> https://answers.launchpad.net/mg5amcnlo/+question/630425
>>>
>>> Status: Needs information => Open
>>>
>>> Boudinar Fatima gave more information on the question:
>>> Hi;
>>> I'm not changing any parameter with respect to the default values, and
>> when
>>> i go inside /home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/
>> SubProcesses/P0_udx_epve/
>>> i find the following chek_poles:
>>> Program DRIVER
>>> c***********************************************************
>> ***************
>>> c This is the driver for the whole calulation
>>> c***********************************************************
>> ***************
>>> implicit none
>>> C
>>> C CONSTANTS
>>> C
>>> double precision pi, zero
>>> parameter (pi=3.1415926535897932385d0)
>>> parameter (zero = 0d0)
>>> integer npoints, npointsChecked
>>> integer i, j, k
>>> integer return_code
>>> double precision tolerance, tolerance_default
>>> double precision, allocatable :: accuracies(:)
>>> double precision accuracy
>>> double precision ren_scale, energy
>>> include 'genps.inc'
>>> include 'nexternal.inc'
>>> include 'nFKSconfigs.inc'
>>> double precision p(0:3, nexternal), prambo(0:3, nexternal)
>>> double precision p_born(0:3,nexternal-1)
>>> common/pborn/p_born
>>> double precision pswgt
>>> double precision fks_double, fks_single
>>> double precision, allocatable :: virt_wgts(:,:)
>>> double precision double, single, finite
>>> double complex born(2)
>>> double precision totmass
>>> logical calculatedborn
>>> common/ccalculatedborn/calculatedborn
>>> logical fksprefact
>>> parameter (fksprefact=.true.)
>>> integer nfksprocess
>>> common/c_nfksprocess/nfksprocess
>>> double precision fkssymmetryfactor,fkssymmetryfactorBorn,
>>> & fkssymmetryfactorDeg
>>> integer ngluons,nquarks(-6:6)
>>> common/numberofparticles/fkssymmetryfactor,fkssymmetryfactorBorn,
>>> & fkssymmetryfactorDeg,ngluons,nquarks
>>> integer fks_j_from_i(nexternal,0:nexternal)
>>> & ,particle_type(nexternal),pdg_type(nexternal)
>>> common /c_fks_inc/fks_j_from_i,particle_type,pdg_type
>>> integer i_fks,j_fks
>>> common/fks_indices/i_fks,j_fks
>>> cc
>>> include 'run.inc'
>>> include 'coupl.inc'
>>> include 'q_es.inc'
>>> integer nsqso
>>> double precision pmass(nexternal), pmass_rambo(nexternal)
>>> integer nfail
>>> logical first_time
>>> data first_time/.TRUE./
>>> include 'FKSParams.inc'
>>>
>>> C-----
>>> C BEGIN CODE
>>> C-----
>>> if (first_time) then
>>> call get_nsqso_loop(nsqso)
>>> allocate(virt_wgts(0:3,0:nsqso))
>>> allocate(accuracies(0:nsqso))
>>> first_time = .false.
>>> endif
>>>
>>> call setrun !Sets up run parameters
>>> call setpara('param_card.dat') !Sets up couplings and masses
>>> call setcuts !Sets up cuts and particle masses
>>> call printout !Prints out a summary of paramaters
>>> call run_printout !Prints out a summary of the run settings
>>> include 'pmass.inc'
>>>
>>> call FKSParamReader('FKS_params.dat',.TRUE.,.FALSE.)
>>> tolerance_default = IRPoleCheckThreshold
>>>
>>> c Set the energy to be characteristic of the run
>>> totmass = 0.0d0
>>> do i=1,nexternal
>>> totmass = totmass + pmass(i)
>>> enddo
>>> energy = max((ebeam(1)+ebeam(2))/20.0d0,2.0d0*totmass)
>>> c Set the renormalization scale to be of the order of sqrt(s) but
>>> c not equal to it so as to be sensitive to all logs in the check.
>>> ren_scale = energy/2.0d0
>>>
>>> write(*,*)' Insert the number of points to test'
>>> read(*,*) npoints
>>> write(*,*)'Insert the relative tolerance'
>>> write(*,*)' A negative number will mean use the default one: ',
>>> 1 tolerance_default
>>> read(*,*) tolerance
>>> if (tolerance .le. zero) tolerance = tolerance_default
>>>
>>> mu_r = ren_scale
>>> qes2 = ren_scale**2
>>>
>>> do i = nincoming+1, nexternal-1
>>> pmass_rambo(i-nincoming) = pmass(i)
>>> enddo
>>>
>>> c Find the nFKSprocess for which we compute the Born-like contributions,
>>> c ie. which is a Born+g real-emission process
>>> do nFKSprocess=1,fks_configs
>>> call fks_inc_chooser()
>>> if (particle_type(i_fks).eq.8) exit
>>> enddo
>>> call fks_inc_chooser()
>>> call leshouche_inc_chooser()
>>> call setfksfactor(1,.false.)
>>>
>>> nfail = 0
>>> npointsChecked = 0
>>>
>>> c Make sure that stability checks are always used by MadLoop, even for
>>> c initialization
>>> CALL FORCE_STABILITY_CHECK(.TRUE.)
>>>
>>> 200 continue
>>> calculatedborn = .false.
>>> if (nincoming.eq.1) then
>>> call rambo(0, nexternal-nincoming-1, pmass(1),
>>> 1 pmass_rambo, prambo)
>>> p_born(0,1) = pmass(1)
>>> p_born(1,1) = 0d0
>>> p_born(2,1) = 0d0
>>> p_born(3,1) = 0d0
>>> elseif (nincoming.eq.2) then
>>> if (nexternal - nincoming - 1 .eq.1) then
>>> ! deal with the case of only one particle in the final
>>> ! state
>>> p_born(0,1) = pmass(3)/2d0
>>> p_born(1,1) = 0d0
>>> p_born(2,1) = 0d0
>>> p_born(3,1) = pmass(3)/2d0
>>> if (pmass(1) > 0d0)
>>> 1 p_born(3,1) = dsqrt(pmass(3)**2/4d0 - pmass(1)**2)
>>> p_born(0,2) = pmass(3)/2d0
>>> p_born(1,2) = 0d0
>>> p_born(2,2) = 0d0
>>> p_born(3,2) = -pmass(3)/2d0
>>> if (pmass(2) > 0d0)
>>> 1 p_born(3,2) = -dsqrt(pmass(3)**2/4d0 - pmass(1)**2)
>>>
>>> prambo(0,1) = pmass(3)
>>> prambo(1,1) = 0d0
>>> prambo(2,1) = 0d0
>>> prambo(3,1) = 0d0
>>>
>>> else
>>> the error giving by make check_poles is:
>>> Command "make" not recognized, please try again.
>>>
>>>
>>> 2017-05-02 12:22 GMT+02:00 marco zaro <question630425@answers.
>> launchpad.net>
>>> :
>>>
>>>> Your question #630425 on MadGraph5_aMC@NLO changed:
>>>> https://answers.launchpad.net/mg5amcnlo/+question/630425
>>>>
>>>> Status: Open => Needs information
>>>>
>>>> marco zaro requested more information:
>>>> Dear Fatima,
>>>> are you changing any parameter with respect to the default values?
>>>> If you go inside /home/fatima/MG5_aMC_v2_3_3/MY_FIRST_AMCATNLO_RU/
>>>> SubProcesses/P0_udx_epve/
>>>> is there a file called check_poles?
>>>> if not, can you tell me what error is given by
>>>> make check_poles?
>>>>
>>>> if yes, what happens issuing in that dir the command
>>>> ./check_poles < ../../check_poles_input.txt?
>>>>
>>>> Thanks
>>>> Cheers,
>>>>
>>>> Marco
>>>>
>>>> --
>>>> To answer this request for more information, you can either reply to
>>>> this email or enter your reply at the following page:
>>>> https://answers.launchpad.net/mg5amcnlo/+question/630425
>>>>
>>>> You received this question notification because you asked the question.
>>>>
>>>
>>> --
>>> You received this question notification because you are assigned to this
>>> question.
>>
>> --
>> If this answers your question, please go to the following page to let us
>> know that it is solved:
>> https://answers.launchpad.net/mg5amcnlo/+question/630425/+
>> confirm?answer_id=2
>>
>> If you still need help, you can reply to this email or go to the
>> following page to enter your feedback:
>> https://answers.launchpad.net/mg5amcnlo/+question/630425
>>
>> You received this question notification because you asked the question.
>>
>
> --
> You received this question notification because you are assigned to this
> question.

Can you help with this problem?

Provide an answer of your own, or ask Boudinar Fatima for more information if necessary.

To post a message you must log in.