File |
Line number |
Procedure |
Code |
./pkg/sphere/sphere.F |
120 |
SHC2GRID |
SUBROUTINE SHC2GRID( LMAX, SHC, NLON, NLAT, GRID, P ) |
./pkg/sphere/sphere.F |
146 |
SHC2GRID |
INTEGER LMAX ! INPUT max. degree |
./pkg/sphere/sphere.F |
147 |
SHC2GRID |
REAL SHC((1+LMAX)*(1+LMAX)) ! INPUT spherical harmonics |
./pkg/sphere/sphere.F |
151 |
SHC2GRID |
REAL P((LMAX+1)*(LMAX+2)/2) ! work space |
./pkg/sphere/sphere.F |
168 |
SHC2GRID |
IF(NLON.LT.LMAX*2 ) CALL SHCERROR('NLON.LT.LMAX*2 ',1) |
./pkg/sphere/sphere.F |
173 |
SHC2GRID |
CALL SHCROTATE(LMAX,SHC,ANGLE) |
./pkg/sphere/sphere.F |
182 |
SHC2GRID |
CALL SHC2ZONE( LMAX, SHC, XLAT1, XLAT2, HS, HN, P ) |
./pkg/sphere/sphere.F |
190 |
SHC2GRID |
CALL SHCROTATE(LMAX,SHC,-ANGLE) |
./pkg/sphere/sphere.F |
196 |
SHC4GRID |
SUBROUTINE SHC4GRID( LMAX, SHC, NLON, NLAT, GRID, P ) |
./pkg/sphere/sphere.F |
200 |
SHC4GRID |
INTEGER LMAX ! INPUT max. degree |
./pkg/sphere/sphere.F |
201 |
SHC4GRID |
REAL SHC((1+LMAX)*(1+LMAX)) ! OUTPUT spherical harmonics |
./pkg/sphere/sphere.F |
205 |
SHC4GRID |
REAL P((LMAX+1)*(LMAX+2)/2) ! work space |
./pkg/sphere/sphere.F |
226 |
SHC4GRID |
IF(NLON.LT.LMAX*2 ) THEN |
./pkg/sphere/sphere.F |
228 |
SHC4GRID |
PRINT *, 'LMAX = ', LMAX |
./pkg/sphere/sphere.F |
245 |
SHC4GRID |
CALL SHC4ZONE(LMAX,SHC,XLAT1,XLAT2,HS,HN,P) |
./pkg/sphere/sphere.F |
247 |
SHC4GRID |
CALL SHCROTATE(LMAX,SHC,-ANGLE) |
./pkg/sphere/sphere.F |
254 |
SHCROTATE |
SUBROUTINE SHCROTATE(LMAX,SHC,ANGLE) |
./pkg/sphere/sphere.F |
258 |
SHCROTATE |
INTEGER LMAX ! max. degree of spherical harmonics. |
./pkg/sphere/sphere.F |
259 |
SHCROTATE |
REAL SHC((1+LMAX)*(1+LMAX)) ! spherical harmonic coeffs. |
./pkg/sphere/sphere.F |
271 |
SHCROTATE |
CALL FRSBASE(ANGLE,H,1,1+LMAX+LMAX) |
./pkg/sphere/sphere.F |
273 |
SHCROTATE |
DO M = 0,LMAX |
./pkg/sphere/sphere.F |
281 |
SHCROTATE |
DO L = M,LMAX |
./pkg/sphere/sphere.F |
297 |
SHC2ZONE |
SUBROUTINE SHC2ZONE(LMAX,SHC,XLAT1,XLAT2,HS,HN,P) |
./pkg/sphere/sphere.F |
301 |
SHC2ZONE |
INTEGER LMAX ! INPUT max. degree of spher. harmonics. |
./pkg/sphere/sphere.F |
302 |
SHC2ZONE |
REAL SHC((1+LMAX)*(1+LMAX)) ! INPUT spherical harmonic coeffs. |
./pkg/sphere/sphere.F |
305 |
SHC2ZONE |
REAL HS(1+LMAX+LMAX) ! OUTPUT |
./pkg/sphere/sphere.F |
306 |
SHC2ZONE |
REAL HN(1+LMAX+LMAX) ! OUTPUT |
./pkg/sphere/sphere.F |
307 |
SHC2ZONE |
REAL P((LMAX+1)*(LMAX+2)/2) ! INPUT |
./pkg/sphere/sphere.F |
327 |
SHC2ZONE |
CALL HELMHOLTZ(LMAX,SLAT,P) |
./pkg/sphere/sphere.F |
328 |
SHC2ZONE |
LMAX1 = LMAX+1 |
./pkg/sphere/sphere.F |
330 |
SHC2ZONE |
DO M = 0,LMAX |
./pkg/sphere/sphere.F |
335 |
SHC2ZONE |
DO L = M,LMAX-1,2 |
./pkg/sphere/sphere.F |
355 |
SHC2ZONE |
IF(MOD(LMAX-L,2).EQ.0) THEN |
./pkg/sphere/sphere.F |
357 |
SHC2ZONE |
J = LMAX*LMAX+LMAX+1 |
./pkg/sphere/sphere.F |
358 |
SHC2ZONE |
Q = FACT(LMAX)*P(K) |
./pkg/sphere/sphere.F |
382 |
SHC4ZONE |
SUBROUTINE SHC4ZONE(LMAX,SHC,XLAT1,XLAT2,HS,HN,P) |
./pkg/sphere/sphere.F |
386 |
SHC4ZONE |
INTEGER LMAX |
./pkg/sphere/sphere.F |
387 |
SHC4ZONE |
REAL SHC((1+LMAX)*(1+LMAX)) ! spherical harmonic coeffs. |
./pkg/sphere/sphere.F |
390 |
SHC4ZONE |
REAL P((LMAX+1)*(LMAX+2)/2) |
./pkg/sphere/sphere.F |
394 |
SHC4ZONE |
REAL HS(1+LMAX+LMAX) |
./pkg/sphere/sphere.F |
395 |
SHC4ZONE |
REAL HN(1+LMAX+LMAX) |
./pkg/sphere/sphere.F |
427 |
SHC4ZONE |
CALL HELMHOLTZ(LMAX,SIN0,P) |
./pkg/sphere/sphere.F |
430 |
SHC4ZONE |
DO M = 0,LMAX |
./pkg/sphere/sphere.F |
445 |
SHC4ZONE |
DO L = M,LMAX-1,2 |
./pkg/sphere/sphere.F |
454 |
SHC4ZONE |
IF(MOD(LMAX-M,2).NE.1) THEN |
./pkg/sphere/sphere.F |
456 |
SHC4ZONE |
K = LMAX*LMAX+LMAX+1 |
./pkg/sphere/sphere.F |
533 |
HELMHOLTZ |
SUBROUTINE HELMHOLTZ(LMAX,S,P) |
./pkg/sphere/sphere.F |
539 |
HELMHOLTZ |
INTEGER LMAX ! INPUT max. degree. |
./pkg/sphere/sphere.F |
559 |
HELMHOLTZ |
IF(LMAX.NE.LMAXOLD) THEN |
./pkg/sphere/sphere.F |
561 |
HELMHOLTZ |
DO L = 1,LMAX |
./pkg/sphere/sphere.F |
564 |
HELMHOLTZ |
Y(L+LMAX) = SNGL(DSQRT(DBLE(FLOAT(L+LMAX)))) |
./pkg/sphere/sphere.F |
565 |
HELMHOLTZ |
ISECT(L) = L*LMAX-L*(L-3)/2+1 |
./pkg/sphere/sphere.F |
567 |
HELMHOLTZ |
CALL RECUR_Z(Z,LMAX) |
./pkg/sphere/sphere.F |
568 |
HELMHOLTZ |
LMAXOLD = LMAX |
./pkg/sphere/sphere.F |
574 |
HELMHOLTZ |
DO M = 1,LMAX |
./pkg/sphere/sphere.F |
580 |
HELMHOLTZ |
DO M = 0,LMAX-N |
./pkg/sphere/sphere.F |
587 |
HELMHOLTZ |
DO N = 2,LMAX |
./pkg/sphere/sphere.F |
588 |
HELMHOLTZ |
DO M = 0,LMAX-N |
./pkg/sphere/sphere.F |
601 |
RECUR_Z |
SUBROUTINE RECUR_Z(Z,LMAX) |
./pkg/sphere/sphere.F |
607 |
RECUR_Z |
INTEGER LMAX |
./pkg/sphere/sphere.F |
608 |
RECUR_Z |
REAL Z(LMAX) |
./pkg/sphere/sphere.F |
614 |
RECUR_Z |
DO L = 1,LMAX |