25INTEGER,
INTENT(IN) :: step, idsearch
26INTEGER,
DIMENSION(TAILLR, NS),
INTENT(IN) :: nri
27INTEGER,
DIMENSION(TAILLR,NUMA,TAILLR),
INTENT(IN) :: rsaved, osaved
28INTEGER,
DIMENSION(NUMA) :: ring_list
29INTEGER,
DIMENSION(:),
ALLOCATABLE :: ring_id
30INTEGER :: raa, rab, rac, rad, rae
34 if (nri(raa,step) > 0)
then
36 call allocate_all_rings (idsearch, step-1, raa, nri(raa,step))
46 do rad=1, nri(rab,step)
48 if (rsaved(rab,rad,rae) .eq. raa)
then
56 if (
allocated(ring_id))
deallocate(ring_id)
57 allocate(ring_id(rac), stat=
err)
59 call show_error (
"Impossible to allocate memory"//char(0), &
60 "Function: RINGS_TO_OGL"//char(0),
"Table: RING_ID (1)"//char(0))
65 ring_id(rad) = ring_list(rad)
68 if (rac > 0)
call send_atom_rings_id_opengl (step-1, raa-1, idsearch, rab-1, rac, ring_id)
73 if (
allocated(ring_id))
deallocate(ring_id)
74 allocate(ring_id(raa), stat=
err)
76 call show_error (
"Impossible to allocate memory"//char(0), &
77 "Function: RINGS_TO_OGL"//char(0),
"Table: RING_ID (2)"//char(0))
81 do rab=1, nri(raa,step)
83 ring_id(rac) = osaved(raa,rab,rac)
85 call send_rings_opengl (idsearch, step-1, raa-1, rab-1, ring_id)
91if (
allocated(ring_id))
deallocate(ring_id)
101INTEGER,
INTENT(IN) :: step, idsearch
102INTEGER,
DIMENSION(TAILLR),
INTENT(IN) :: nri
103INTEGER,
DIMENSION(TAILLR,NUMA,TAILLR),
INTENT(IN) :: rsaved, osaved
104INTEGER,
DIMENSION(NUMA) :: ring_list
105INTEGER,
DIMENSION(:),
ALLOCATABLE :: ring_id
106INTEGER :: raa, rab, rac, rad, rae
109 if (nri(raa) > 0)
call allocate_all_rings (idsearch, step-1, raa, nri(raa))
120 if (rsaved(rab,rad,rae) .eq. raa)
then
128 if (
allocated(ring_id))
deallocate(ring_id)
129 allocate(ring_id(rac), stat=
err)
131 call show_error (
"Impossible to allocate memory"//char(0), &
132 "Function: RINGS_TO_OGL_BIS"//char(0),
"Table: RING_ID (1)"//char(0))
137 ring_id(rad) = ring_list(rad)
140 if (rac > 0)
call send_atom_rings_id_opengl (step-1, raa-1, idsearch, rab, rac, ring_id)
145 if (
allocated(ring_id))
deallocate(ring_id)
146 allocate(ring_id(raa), stat=
err)
148 call show_error (
"Impossible to allocate memory"//char(0), &
149 "Function: RINGS_TO_OGL_BIS"//char(0),
"Table: RING_ID (2)"//char(0))
155 ring_id(rac) = osaved(raa,rab,rac)
157 call send_rings_opengl (idsearch, step-1, raa, rab-1, ring_id)
163if (
allocated(ring_id))
deallocate(ring_id)