49 panelID_table, pi_table, pj_table, &
50 tileID_map, tileFaceID_map, tilePanelID_map, &
57 integer,
intent(in) :: ntile
58 integer,
intent(out) :: panelid_table(ntile)
59 integer,
intent(out) :: pi_table(ntile)
60 integer,
intent(out) :: pj_table(ntile)
61 integer,
intent(out) :: tileid_map(4,ntile)
62 integer,
intent(out) :: tilefaceid_map(4,ntile)
63 integer,
intent(out) :: tilepanelid_map(4,ntile)
65 integer :: ntileperpanel
66 integer :: nex, ney, nvx, nvy
67 integer,
allocatable :: nodesid_2d(:,:,:)
68 integer,
allocatable :: etov(:,:)
69 integer,
allocatable :: etoe(:,:)
70 integer,
allocatable :: etof(:,:)
73 integer :: tileid, tileid_r
77 ntileperpanel = ntile / 6
78 ney = int( sqrt(dble(ntileperpanel)) )
79 nex = ntileperpanel/ney
82 allocate( nodesid_2d(nvx,nvy,6) )
83 allocate( etov(ntile,4), etoe(ntile,4), etof(ntile,4) )
90 nodesid_2d(i,j,panelid) = counter
102 panelid_table(tileid) = panelid
103 pi_table(tileid) = i; pj_table(tileid) = j;
104 etov(tileid,:) = (/ nodesid_2d(i,j ,panelid), nodesid_2d(i+1,j ,panelid), &
105 nodesid_2d(i,j+1,panelid), nodesid_2d(i+1,j+1,panelid) /)
112 tileid_map(:,:) = transpose(etoe)
113 tilefaceid_map(:,:) = transpose(etof)
117 tileid_r = tileid_map(f,tileid)
118 tilepanelid_map(f,tileid) = panelid_table(tileid_r)
123 tilepanelid_map, tileid_map, tilefaceid_map, &
124 panelid_table, pi_table, pj_table, nex, ney, ntile, 4 )
132 panelID_table, pi_table, pj_table, NeX, NeY, Ntile, Nface )
134 integer,
intent(in) :: ntile
135 integer,
intent(in) :: nface
136 integer,
intent(out) :: tileid_map(nface,ntile)
137 integer,
intent(out) :: tilefaceid_map(nface,ntile)
138 integer,
intent(out) :: tilepanelid_map(nface,ntile)
139 integer,
intent(in) :: panelid_table(ntile)
140 integer,
intent(in) :: pi_table(ntile)
141 integer,
intent(in) :: pj_table(ntile)
142 integer,
intent(in) :: nex, ney
144 integer :: panel_connectivity(4,6)
145 integer :: face_connectivity (4,6)
154 panel_connectivity, face_connectivity )
158 panelid = panelid_table(tileid)
161 if ( tilefaceid_map(f,tileid) /= f ) cycle
163 pi_ = pi_table(tileid)
164 pj_ = pj_table(tileid)
166 select case( panelid )
168 if ( mod(f,2) == 0 )
then
169 if ( pi_table(tileid) == 1 ) pi_ = nex
170 if ( pi_table(tileid) == nex ) pi_ = 1
172 if ( pj_table(tileid) == 1 ) pj_ = ney
173 if ( pj_table(tileid) == ney ) pj_ = 1
176 if ( mod(f,2) == 0 )
then
177 if ( pi_table(tileid) == 1 ) pi_ = nex
178 if ( pi_table(tileid) == nex ) pi_ = 1
180 if ( pj_table(tileid) == 1 )
then
181 pi_ = nex; pj_ = ney - pi_table(tileid) + 1
183 if ( pj_table(tileid) == ney )
then
184 pi_ = nex ; pj_ = pi_table(tileid)
188 if ( mod(f,2) == 0 )
then
189 if ( pi_table(tileid) == 1 ) pi_ = nex
190 if ( pi_table(tileid) == nex ) pi_ = 1
192 if ( pj_table(tileid) == 1 )
then
193 pi_ = nex - pi_table(tileid) + 1; pj_ = 1
195 if ( pj_table(tileid) == ney )
then
196 pi_ = nex - pi_table(tileid) + 1; pj_ = ney
200 if ( mod(f,2) == 0 )
then
201 if ( pi_table(tileid) == 1 ) pi_ = nex
202 if ( pi_table(tileid) == nex ) pi_ = 1
204 if ( pj_table(tileid) == 1 )
then
205 pi_ = 1; pj_ = pi_table(tileid)
207 if ( pj_table(tileid) == ney )
then
208 pi_ = 1; pj_ = ney - pi_table(tileid) + 1;
213 if ( mod(f,2) == 0 )
then
214 if ( pi_table(tileid) == 1 ) pi_ = ney - pj_table(tileid) + 1
215 if ( pi_table(tileid) == nex ) pi_ = pj_table(tileid)
217 if ( pj_table(tileid) == 1 ) pi_ = pi_table(tileid)
218 if ( pj_table(tileid) == ney ) pi_ = nex - pi_table(tileid) + 1
222 if ( mod(f,2) == 0 )
then
223 if ( pi_table(tileid) == 1 ) pi_ = pj_table(tileid)
224 if ( pi_table(tileid) == nex ) pi_ = ney - pj_table(tileid) + 1
226 if ( pj_table(tileid) == 1 ) pi_ = nex - pi_table(tileid) + 1
227 if ( pj_table(tileid) == ney ) pi_ = pi_table(tileid)
231 tilepanelid_map(f,tileid) = panel_connectivity(f,panelid)
232 tileid_map(f,tileid) = pi_ + (pj_ - 1) * nex + (tilepanelid_map(f,tileid) - 1) * nex * ney
233 tilefaceid_map(f,tileid) = face_connectivity(f,panelid)
255 integer,
intent(out) :: panel_connectivity(4,6)
256 integer,
intent(out) :: face_connectivity(4,6)
259 integer :: zonal_panelid_list(0:5)
261 zonal_panelid_list(:) = (/ 4, 1, 2, 3, 4, 1/)
263 panel_connectivity(1,n) = 6
264 if (zonal_panelid_list(4-n) > 2)
then
265 face_connectivity(1,n) = +zonal_panelid_list(4-n)
267 face_connectivity(1,n) = -zonal_panelid_list(4-n)
270 panel_connectivity(2,n) = zonal_panelid_list(n+1)
271 face_connectivity(2,n) = 4
273 panel_connectivity(3,n) = 5
274 face_connectivity(3,n) = n
276 face_connectivity(3,n) = -n
278 face_connectivity(3,n) = n
281 panel_connectivity(4,n) = zonal_panelid_list(n-1)
282 face_connectivity(4,n) = 2
285 panel_connectivity(:,5) = (/ 1, 2, 3, 4 /)
286 face_connectivity(:,5) = (/ 3, 3, -3, -3 /)
287 panel_connectivity(:,6) = (/ 3, 2, 1, 4 /)
288 face_connectivity(:,6) = (/ -1, -1, 1, 1 /)
298 integer,
intent(in) :: np
299 integer,
intent(out) :: panelid(np)
300 real(rp),
intent(in) :: lon(np)
301 real(rp),
intent(in) :: lat(np)
305 real(rp) :: alph(np), beta(np)
306 real(rp) :: lon_(np), lat_(np)
308 real(rp),
parameter :: eps = 1.0e-64_rp
313 if ( abs(cos(lon(p))) < eps )
then
314 lon_(p) = lon(p) + eps
318 if ( abs( lat(p) - 0.5_rp * pi ) < eps )
then
319 lat_(p) = lat(p) - sign(eps, lat(p))
332 where ( lat(:) > 0.0_rp .and. abs(alph(:)) <= 0.25_rp * pi .and. abs(beta(:)) <= 0.25_rp * pi )
336 where ( lat(:) < 0.0_rp .and. abs(alph(:)) <= 0.25_rp * pi .and. abs(beta(:)) <= 0.25_rp * pi )
340 where ( abs(alph(:)) <= 0.25_rp * pi .and. abs(beta(:)) <= 0.25_rp * pi )
347 if (panelid(p) < 0)
then
348 log_error(
"MeshUtilCubedSphere2D_getPanelID",*)
'Fail to search a panel ID of cubed sphere grid!'
349 write(*,*)
"p=", p,
": (lon,lat)=", lon(p), lat(p),
"(alpha,beta)=", alph(p), beta(p)
subroutine, public meshutil2d_buildinteriormap(vmapm, vmapp, mapm, mapp, pos_en, pos_ev, etoe, etof, etov, fmask, ne, np, nfp, nfaces, nv)
subroutine, public meshutil2d_genpatchboundarymap(vmapb, mapb, vmapp, pos_en, xmin, xmax, ymin, ymax, fmask, ne, np, nfp, nfaces, nv)