36 . IXS,IXC,IXT,IXP,IXR,IXTG,IXS10,
37 . ADDCNEL,CNEL,TAG_NODE,TAG_ELEM )
53#include "implicit_f.inc"
63 INTEGER,
INTENT(in) ::
64 INTEGER,
DIMENSION(4*NB_SURFACE),
INTENT(in) ::
65 TYPE(nodal_arrays_),
INTENT(INOUT) :: NODES
67 TYPE(intbuf_struct_),
DIMENSION(NINTER),
INTENT(inout) :: INTBUF_TAB
69 INTEGER,
DIMENSION(NIXS,NUMELS),
INTENT(in) :: IXS
70 INTEGER,
DIMENSION(NIXC,NUMELC),
INTENT(in) :: IXC
71 INTEGER,
DIMENSION(NIXT,NUMELT),
INTENT(in) :: IXT
72 INTEGER,
DIMENSION(NIXP,NUMELP),
INTENT(in) :: IXP
73 INTEGER,
DIMENSION(NIXR,NUMELR),
INTENT(in) :: IXR
74 INTEGER,
DIMENSION(NIXTG,NUMELTG),
INTENT(in) :: IXTG
75 INTEGER,
DIMENSION(6,NUMELS10),
INTENT(in) :: IXS10
76 INTEGER,
DIMENSION(0:NUMNOD+1),
INTENT(in) :: ADDCNEL
77 INTEGER,
DIMENSION(NPARI,NINTER),
INTENT(in) :: IPARI
78 my_real,
DIMENSION(NPROPG,NUMGEO),
INTENT(in) :: geo
79 INTEGER,
DIMENSION(0:LCNEL),
INTENT(in) :: CNEL
80 INTEGER,
DIMENSION(NUMNOD),
INTENT(inout) :: TAG_NODE
81 INTEGER,
DIMENSION(NUMELS+NUMELQ+NUMELC+NUMELT+NUMELP+NUMELR+NUMELTG),
INTENT(inout) :: TAG_ELEM
85 INTEGER :: I,J,NODE_ID
86 INTEGER :: NB_SURFACE_R_PROC
87 INTEGER,
DIMENSION(4) :: LOCAL_NODE,GLOBAL_NODE
88 INTEGER,
DIMENSION(:),
ALLOCATABLE :: LIST_SURFACE_R_PROC
91 INTEGER :: NODE_SURF_NB
92 INTEGER :: NB_RESULT_INTERSECT,NB_SURFACE_1,
93 INTEGER,
DIMENSION(:),
ALLOCATABLE :: RESULT_INTERSECT,INTERSECT_1,INTERSECT_2
94 INTEGER,
DIMENSION(:),
ALLOCATABLE :: TMP_ARRAY
99 ALLOCATE( list_surface_r_proc(4*nb_surface) )
100 nb_surface_r_proc = 0
104 ALLOCATE( result_intersect( shoot_struct%MAX_SURF_NB ) )
105 ALLOCATE( intersect_1( shoot_struct%MAX_SURF_NB ) )
106 ALLOCATE( intersect_2( shoot_struct%MAX_SURF_NB ) )
110 global_node(1:4) = list_node( (i-1)*4+1:(i-1)*4+4)
112 local_node(j) = get_local_node_id(nodes,global_node(j))
114 node_id = local_node(1)
116 nb_result_intersect = shoot_struct%SHIFT_M_NODE_SURF(node_id+1) - shoot_struct%SHIFT_M_NODE_SURF(node_id)
117 shift = shoot_struct%SHIFT_M_NODE_SURF(node_id)
118 result_intersect(1:nb_result_intersect) = shoot_struct%M_NODE_SURF( shift+1:shift+nb_result_intersect )
121 IF(local_node(3)==local_node(4)) node_surf_nb = 3
124 nb_surface_1 = nb_result_intersect
125 intersect_1(1:nb_surface_1) = result_intersect(1:nb_result_intersect)
126 node_id = local_node(j)
129 nb_surface_2 = shoot_struct%SHIFT_M_NODE_SURF(node_id+1) - shoot_struct%SHIFT_M_NODE_SURF(node_id)
130 shift = shoot_struct%SHIFT_M_NODE_SURF(node_id)
131 intersect_2(1:nb_surface_2) = shoot_struct%M_NODE_SURF( shift+1:shift+nb_surface_2 )
132 IF(nb_surface_1>0.AND.nb_surface_2>0)
THEN
133 CALL intersect_2_sorted_sets( intersect_1,nb_surface_1,
134 . intersect_2,nb_surface_2,
135 . result_intersect,nb_result_intersect )
137 nb_result_intersect = 0
142 IF(nb_surface_r_proc + nb_result_intersect >
SIZE(list_surface_r_proc) )
THEN
143 ALLOCATE( tmp_array(nb_surface_r_proc) )
144 tmp_array(1:nb_surface_r_proc) = list_surface_r_proc(1:nb_surface_r_proc)
145 DEALLOCATE( list_surface_r_proc )
146 ALLOCATE( list_surface_r_proc( (nb_surface_r_proc+nb_result_intersect) * 2 ) )
147 list_surface_r_proc(1:nb_surface_r_proc) = tmp_array(1:nb_surface_r_proc)
148 DEALLOCATE( tmp_array )
151 list_surface_r_proc(1+nb_surface_r_proc:nb_surface_r_proc+nb_result_intersect) =
152 . result_intersect(1:nb_result_intersect)
153 nb_surface_r_proc = nb_surface_r_proc + nb_result_intersect
156 CALL check_surface_state( -1,nb_surface_r_proc,list_surface_r_proc,shoot_struct%SHIFT_INTERFACE,intbuf_tab,
158 . ixs,ixc,ixt,ixp,ixr,ixtg,ixs10,
161 DEALLOCATE( list_surface_r_proc )
162 DEALLOCATE( result_intersect )
163 DEALLOCATE( intersect_1 )
164 DEALLOCATE( intersect_2 )
subroutine check_surface_state(itask, surfarce_nb, surface_id, shift_interface, intbuf_tab, ipari, geo, ixs, ixc, ixt, ixp, ixr, ixtg, ixs10, addcnel, cnel, tag_node, tag_elem, shoot_struct)
subroutine find_surface_from_remote_proc(shoot_struct, nb_surface, list_node, intbuf_tab, nodes, ipari, geo, ixs, ixc, ixt, ixp, ixr, ixtg, ixs10, addcnel, cnel, tag_node, tag_elem)