main.dvi

Size: px
Start display at page:

Download "main.dvi"

Transcription

1 y () 5 C Fortran () Fortran 32bit 64bit bit bit bit bit byte 8bit 1byte byte Fortran A A 8byte double presicion y ( REAL*8) A 64bit 4byte REAL 32bit REAL A(1001,1001)! 4byte DOUBLE PRECISION B(1001,1001)! 8byte A byte 3:82MB 1 B A 7:65MB REAL A(1001,1001) REAL A(1000,1000) REAL A(1024,1024) 1 MB MegaByte 1MB byte 1

2 128 2n 4n (n ) (bank conict) [1] 2n +1 4n +1 2 (oating point number) M-1800/20 Fortran 24bit 56bit 3 M-1800/20 IBM 4 4 bit =10 x =10 x x IEEE bit 4 IBM International Business Machines 5 6 IEEE Institute of Electrical and Electronics Engineers CRAY 1 1: IBM IEEE (7:22 ) (6:92 ) (16:86 ) (15:65 ) ( ) 10 IEEE IBM IBM ( [2] [3]) [4] IEEE IBM 1 \" \ " 4 [5], [6] I (64bit) (32bit) 4 4 Fortran 2

3 4 7 FUJITSU M-1800/20 FU- JITSU VP2600/ VMGGM, DVMGGM VLAX, DVLAX 1 \D" SSL II, SSL II/VP 8 [8] n n = 16, 32, 64, 128, 256, 512, >< >: A = B =(b ij ) b ij =r 2 n +1 f =(f i ) f i = nx j=1 b ij sin ij n +1 (1) C = A 2 B Ax = f 7 JIS Fortran 90 ([7]) Fortran 4 8 x = (x i ) Fortran CLOCK ([9]) 9 CALL CLOCK(T1,2,2) CALL DVMGGM(A,MAXN,B,MAXN,C,MAXN,N,N,N,ICON) CALL CLOCK(T2,2,2) CPU=(T1-T2)*1.0D-3 CLOCK : M-1800/ (: ) n = :1 CLOCK 10 n = FORTRAN77 EX CLOCK 3

4 2: I M-1800/20 VP2600/10 OS OS IV/MSP V10L10 OS IV/MSP V10L10 FORTRAN77 EX V12L10 FORTRAN77 EX/VP V12L10 SSL II V12L10 SSL II/VP V12L10 VMGGM, DVMGGM ( ) VLAX, DVLAX ( 1 ) 4: VP2600/ (: ) MYLU 2 OPT(E) :2 1:9 3, 4 SSL II Fortran n 4000 A f (1) Ax = f x =(1; 1; 111; 1) 1 Ax = b Gauss MYLU MYLU MYLU x =(x i ) max jx i 0 1j 1in 5: Fortran M-1800/20 VP2600/ E E E E-8 (: ) 1: :2 189 M-1800/20 \1.02E+2" VP2600/

5 7 VP2600/ DO \ " I FORTRAN Fortran Formula Translation Fortran \FORTRAN" Fortran 90 F Fortran 90 \FORTRAN" \Fortran" \FORTRAN77 EX" \Fortran" FACOM M-1800/20 VP2600/10 \FUJITSU" M VP \FUJITSU" \FACOM" FACOM Factory Automation COMputer [10] FACOM Fuck on 11 FUJITSU M-1800/20 5

6 I DVLAX DVMGGM [11] SSL II Fortran II FLOPS FLOPS Floating Point Operations per Second 1 FLOPS MFLOPS, GFLOPS 12 \raison 13 () FLOPS do 10 i=1,n do 10 j=1,n do 10 k=1,n c(i,j)=c(i,j)+a(i,k)*b(k,j) 10 continue DO i, j, k 2 2 n 2 n 2 n = 2n 3 FLOPS FLOPS = 2n3 ( ) i, j, k c 6 DO IJK do 10 i=1,n do 10 j=1,n do 10 k=1,n c(i,j)=c(i,j)+a(i,k)*b(k,j) 10 continue do 10 j=1,n do 10 i=1,n do 10 k=1,n JIK c(i,j)=c(i,j)+a(i,k)*b(k,j) 10 continue 13 d'hatetre"( ) 6

7 do 10 k=1,n KIJ do 10 i=1,n do 10 j=1,n c(i,j)=c(i,j)+a(i,k)*b(k,j) 10 continue do 10 k=1,n do 10 j=1,n do 10 i=1,n KJI c(i,j)=c(i,j)+a(i,k)*b(k,j) 10 continue do 10 i=1,n do 10 k=1,n IKJ do 10 j=1,n c(i,j)=c(i,j)+a(i,k)*b(k,j) 10 continue do 10 j=1,n do 10 k=1,n do 10 i=1,n JKI c(i,j)=c(i,j)+a(i,k)*b(k,j) 10 continue Fortran [1] II I M-1800/20 VP2600/10 DEC AlphaStation Sun Microsystems SPARCstation (optimization) 14 : : : : : : : M-1800/20 VP2600/10 OPT(E) VP2600/ ( A = B =(b ij ) (2) b ij = n +10max(i; j) 7

8 1: (MFLOPS) [1] JIK IJK KJI KIJ IKJ Fortran JKI VP2600/10 VP-200 JKI IJK 1988 VP-200 VP2600/10 FOR- TRAN77 EX/VP DO VP2600/10 8

9 2: ( ) [11] II 18 black box SSL II/VP, NUMPAC/VP

10 (benchmark) Fortran C Dhrystone, Whetstone, Livermore Fortran Kernels, NAS Kernel, Linpack, SPEC, PERFECT Benchmark FUJITSU VP2600/10 10

11 1 1 A \ " 1 (linear equation) ( ) 1 Ax = b A 0 (sparse matrix) 0 (band matrix) A b x A Gauss Gauss (Gaussian elimination) 1 Gauss- Jordan Gauss-Seidel \Gauss" Gauss- Jordan Gauss-Jordan Gauss Gauss 1:5 [13] Gauss A L U LU (LU decomposition) L U x 22 A LU 0 [2] Gauss A 0 (dense matrix) n 1 Gauss 22 () 11

12 Gauss n 3n 3 =2 LU A b LU 1 FLOPS III Gauss 1 Gauss A (pivot) 0 23 (partial pivoting) 24 (complete pivoting) Gauss LU Gauss SUBROUTINE MYLU(A,B,N,NX,P,VW) DOUBLE PRECISION A(NX,1),B(1),VW(1),D INTEGER N,NX,I,J,K,L,P(1)! PARTIAL PIVOTING DO 10 K=1,N P(K)=K 10 CONTINUE DO 20 K=1,N D=0.0D0 DO 30 I=k,N IF(ABS(A(P(I),K)).GE.D) THEN D=ABS(A(P(I),K)) L=I END IF 30 CONTINUE IF(K.NE.L) THEN J=P(K) P(K)=P(L) P(L)=J END IF! LU DECOMPOSITION A(P(K),K)=1.0D0/A(P(K),K) DO 40 I=K+1,N A(P(I),K)=A(P(I),K)*A(P(K),K) DO 50 J=K+1,N A(P(I),J)=A(P(I),J)-A(P(I),K)*A(P(K),J) 50 CONTINUE 40 CONTINUE 20 CONTINUE! FORWARD ELIMINATION DO 60 I=1,N VW(I)=B(P(I)) DO 70 J=1,I-1 VW(I)=VW(I)-A(P(I),J)*VW(J) 70 CONTINUE 60 CONTINUE! BACKWARD SUBSTITUTION DO 80 I=N,1,-1 B(I)=VW(I) DO 90 J=I+1,N B(I)=B(I)-A(P(I),J)*B(J) 90 CONTINUE B(I)=B(I)*A(P(I),I) 80 CONTINUE RETURN END MYLU 12

13 Gauss 8: III DLAX DVLAX LEQLUW DGEFA & DGESL SSL II/VP SSL II/VP( ) NUMPAC/VP Linpack (64bit) Linpack LU DGEFA DGESL DGEFA DGESL DO BLAS CALL DO [14] DGEFA & DGESL Fortran exact [15] n I I ( ) 25 VP2600/10 I, II DLAX, DVLAX, LEQLUW DGEFA & DGESL MYLU OPT(E) Linpack Linpack Argonne Dongarra >< >: A =(a ij ) a ij = a ji = n +10 i (if i j) b =(b i ) X n0i+1 b i = k=1 n 0 k +1 n (3) Ax = b x =(1=n; 1=n; 111; 1=n) II II (1) 8>< A =(a ij ) a ij =r 2 ij sin (i; j =1; 2; 111;n) n +1 n +1 b =(f i ) >: b i = nx j=1 b ij (i =1; 2; 111;n) Ax = b x = (1; 1; 111; 1) CLOCK error ^x i 13

14 4: Gauss (MFLOPS) VP2600/10 4:9GFLOPS DVLAX \" DVLAX DLAX LEQLUW Fortran DLAX Fortran MYLU 4 9, 10 n SSL II/VP DLAXR II ( 14

15 9: Gauss ( I) n =1000 n = 7000 DLAX E E-07 DVLAX E E-07 LEQLUW E E-07 MYLU E E-07 DGEFA&DGESL E E : Gauss ( II) n =1000 n = 7000 DLAX E E-11 DVLAX E E-11 LEQLUW E E-11 MYLU E E-12 DGEFA&DGESL E E-11 ) III Carl Friedrich Gauss Gauss Gauss Gauss Gauss Gauss ( ) Gauss Gauss ( ) Gauss Gauss Carl Friedrich Gauss \Gauss" Gauss Carl Friedrich Gauss Braunschweig Gauss 22 Euclid 2 Gauss Braunschweig Gauss

16 Fortran C, C++ ( ) (JIS) sin, cos, log 7 15 black box FORTRAN CABS( ) ( ) 3 Fortran [9] 28 Tailor 4 sqrt 4.16E D-17 exp 4.56E D-16 log 4.68E D-16 sin 3.28E D-17 cos 4.18E D-17 tan 8.17E D-15 arctan 7.01E D-16 FORTRAN77 EX FORTRAN77 EX ATAN [16] arctan = 4 (arctan arctan 1 3 ) Euler = 4 (2 arctan arctan 1 7 ) Clausen = 4 (4 arctan arctan ) Machin = 4 (4 arctan arctan 3 79 ) Euler-Vega = 4 (arctan arctan arctan 1 8 )Dase = 4 (4 arctan arctan arctan 1 99 ) Rutherford M-1800/ M-1800/20 IBM 1 29 = 4 arctan(1) 16

17 5: A n order arctan arctan II nx r=1 arctan 1 r 2 + r +1 = arctan n n +2 ( 1 1 ) 4 n = 2 1 ; 2 2 ; 111; n n 1 n 17

18 8: D NUMPAC DCOTHP COT 2 NUMPAC 2 cos 18

19 C Fortran 9: E 9 \ " n =2 30 = M-1800/20 IBM IEEE IV David Chudnovsky 19

20 C Fortran Fortran, C, C++, Pascal C Fortran \ " 35 C Fortran [7] 30 Fortran Fortran Fortran M. Metcalf, J.Reid Fortran ISDN Pascal C Fortran Fortran Fortran 36 Fortran C C Fortran 90 Fortran 95 Fortran Fortran 90 C (cf.[7]) C Fortran Fortran C IV Fortran C VP2600/

21 10: C Fortran () VP2600/10 SPARCstation C 21

22 11: C Fortran ( ) SPARCstation AlphaStation Fortran VP2600/10 Fortran VP2600/10 M-1800/20 AlphaStation SPARCstation Fortran () Fortran 10 (2) 20 c 30 C = A 2 B JKI 40 C 0 A 2 B + A T 2 B T parameter(maxn=401,n=maxn-1) real*8 a(maxn,maxn),b(maxn,maxn), & c(maxn,maxn) integer i,j,k do 10 j=1,n do 10 i=1,n a(i,j)=dble(n+1-max(i,j)) b(i,j)=a(i,j) 10 continue do 20 j=1,n do 20 i=1,n c(i,j)=0.0d0 20 continue do 30 j=1,n do 30 k=1,n do 30 i=1,n c(i,j)=c(i,j)+a(i,k)*b(k,j) 30 continue do 40 j=1,n do 40 k=1,n do 40 i=1,n c(i,j)=c(i,j)-a(i,k)*b(k,j)+a(k,i)*b(j,k) 40 continue END Fortran 2 C #include <stdio.h> #define maxn 401 #define n maxn-1 main() { double a[maxn][maxn],b[maxn][maxn], c[maxn][maxn]; } int i,j,k,z; for(j=0; j<n; j++) { for(i=0; i<n; i++) { } z = (i>j)? (i+1):(j+1) ; a[i][j]=(double)(n+1-z); b[i][j]=a[i][j]; } for(j=0; j<n; j++) { for(i=0; i<n; i++) { c[i][j]=0.0; } } for(j=0; j<n; j++) { } for(k=0; k<n; k++) { for(i=0; i<n; i++) { c[i][j] += a[i][k]*b[k][j]; } } for(j=0; j<n; j++) { for(k=0; k<n; k++) { for(i=0; i<n; i++) { } } c[i][j] += -a[i][k]*b[k][j] +a[k][i]*b[j][k] ; } C Fortran 2 22

23 13: C Fortran ( ) 13 Fortran 1 2 C M-1800/20 SPARCstation10/ AlphaStation 2 VP2600/10 2 C

24 VP2600/10 Fortran VP2600/10 M-1800/20 AlphaStation SPARCstation SPARCstation Fortran C V Fortran Fortran C f2c C ( ) Fortran C () 3 Navier-Stokes illustration : Hidaki Naoko and SPARCstation 24

25 [1] :, 9, (1988). [2] :, 7, (1984). [18] II, (1957). [19] : e 2,, Vol.24, No.1, 34{42 (1993). [3] :, 12, (1993). [4] :,, Vol.27, No.2, 93{110 (1994). [5], Vol.31, Np.9 (1990). [6] :,,Vol.27, No.5, 556{580 (1994). [7] M.Metcalf,J.Reid(,,, ) : Fortran90, bit, (1993). [8] SSL II ( ), 99SP{4070-2, (1991) [9] OS IV/MSP FORTRAN77 EX V12, 79SP-5031 (1991). [10] :, (1994). [11] :, 9, (1989). [12] OS IV/MSP FORTRAN77 EX/VP V12, 79SP-5041 (1991). [13], :, (1985). [14] :,, Vol.31, No.3, pp.313{320 (1990). [15] Gregory, R. T. and Karney, D. L.: A collection of matrices for testing computational algorithms, John Wiley & Sons, New York (1969). [16] :, (1991). [17], :, (1983)

main.dvi

main.dvi 3 Signicant discrepancies (between the computed and the true result) are very rare, too rare to worry about all the time, yet not rare enough to ignore. by W.M.Kahan supercomputer 1 supercomputer supercomputer

More information

main.dvi

main.dvi 3 4 2 3 4 2 3 ( ) ( ) 1 1.1 R n R n n Euclid R n R n f =(f 1 ;f 2 ;:::;f n ) T : f(x) =0 (1) x = (x 1 ;x 2 ;:::;x n ) T 2 R n 1 \T " f i (1 i n) R n R (1) f i (x) =0 (1 i n) n 2 n x =cosx f(x) :=x 0 cos

More information

1 5 13 4 1 41 1 411 1 412 2 413 3 414 3 415 4 42 6 43 LU 7 431 LU 10 432 11 433 LU 11 44 12 441 13 442 13 443 SOR ( ) 14 444 14 445 15 446 16 447 SOR 16 448 16 45 17 4 41 n x 1,, x n a 11 x 1 + a 1n x

More information

sim98-8.dvi

sim98-8.dvi 8 12 12.1 12.2 @u @t = @2 u (1) @x 2 u(x; 0) = (x) u(0;t)=u(1;t)=0fort 0 1x, 1t N1x =1 x j = j1x, t n = n1t u(x j ;t n ) Uj n U n+1 j 1t 0 U n j =1t=(1x) 2 = U n j+1 0 2U n j + U n j01 (1x) 2 (2) U n+1

More information

「産業上利用することができる発明」の審査の運用指針(案)

「産業上利用することができる発明」の審査の運用指針(案) 1 1.... 2 1.1... 2 2.... 4 2.1... 4 3.... 6 4.... 6 1 1 29 1 29 1 1 1. 2 1 1.1 (1) (2) (3) 1 (4) 2 4 1 2 2 3 4 31 12 5 7 2.2 (5) ( a ) ( b ) 1 3 2 ( c ) (6) 2. 2.1 2.1 (1) 4 ( i ) ( ii ) ( iii ) ( iv)

More information

1 4 1 ( ) ( ) ( ) ( ) () 1 4 2

1 4 1 ( ) ( ) ( ) ( ) () 1 4 2 7 1995, 2017 7 21 1 2 2 3 3 4 4 6 (1).................................... 6 (2)..................................... 6 (3) t................. 9 5 11 (1)......................................... 11 (2)

More information

倍々精度RgemmのnVidia C2050上への実装と応用

倍々精度RgemmのnVidia C2050上への実装と応用 .. maho@riken.jp http://accc.riken.jp/maho/,,, 2011/2/16 1 - : GPU : SDPA-DD 10 1 - Rgemm : 4 (32 ) nvidia C2050, GPU CPU 150, 24GFlops 25 20 GFLOPS 15 10 QuadAdd Cray, QuadMul Sloppy Kernel QuadAdd Cray,

More information

untitled

untitled II(c) 1 October. 21, 2009 1 CS53 yamamoto@cs.kobe-u.ac.jp 3 1 7 1.1 : : : : : : : : : : : : : : : : : : : : : : 7 1.2 : : : : : : : : : : : : : : : : 8 1.2.1 : : : : : : : : : : : : : : : : : : : 8 1.2.2

More information

XMPによる並列化実装2

XMPによる並列化実装2 2 3 C Fortran Exercise 1 Exercise 2 Serial init.c init.f90 XMP xmp_init.c xmp_init.f90 Serial laplace.c laplace.f90 XMP xmp_laplace.c xmp_laplace.f90 #include int a[10]; program init integer

More information

CPU Levels in the memory hierarchy Level 1 Level 2... Increasing distance from the CPU in access time Level n Size of the memory at each level 1: 2.2

CPU Levels in the memory hierarchy Level 1 Level 2... Increasing distance from the CPU in access time Level n Size of the memory at each level 1: 2.2 FFT 1 Fourier fast Fourier transform FFT FFT FFT 1 FFT FFT 2 Fourier 2.1 Fourier FFT Fourier discrete Fourier transform DFT DFT n 1 y k = j=0 x j ω jk n, 0 k n 1 (1) x j y k ω n = e 2πi/n i = 1 (1) n DFT

More information

OHP.dvi

OHP.dvi 0 7 4 0000 5.. 3. 4. 5. 0 0 00 Gauss PC 0 Gauss 3 Gauss Gauss 3 4 4 4 4 3 4 4 4 4 3 4 4 4 4 3 4 4 4 4 u [] u [3] u [4] u [4] P 0 = P 0 (),3,4 (,), (3,), (4,) 0,,,3,4 3 3 3 3 4 4 4 4 0 3 6 6 0 6 3 6 0 6

More information

all.dvi

all.dvi fortran 1996 4 18 2007 6 11 2012 11 12 1 3 1.1..................................... 3 1.2.............................. 3 2 fortran I 5 2.1 write................................ 5 2.2.................................

More information

n 第1章 章立ての部分は、書式(PC入門大見出し)を使います

n 第1章 章立ての部分は、書式(PC入門大見出し)を使います FORTRAN FORTRAN FORTRAN ) DO DO IF IF FORTRAN FORTRAN(FORmula TRANslator)1956 IBM FORTRAN IV FORTRAN77 Fortran90 FORTRAN77 FORTRAN FORTARN IF, DO C UNIX FORTRAN PASCAL COBOL PL/I BASIC Lisp PROLOG Lisp

More information

untitled

untitled ,, 2 2.,, A, PC/AT, MB, 5GB,,,, ( ) MB, GB 2,5,, 8MB, A, MB, GB 2 A,,,? x MB, y GB, A (), x + 2y () 4 (,, ) (hanba@eee.u-ryukyu.ac.jp), A, x + 2y() x y, A, MB ( ) 8 MB ( ) 5GB ( ) ( ), x x x 8 (2) y y

More information

2 8 BASIC (4) WWW Taylor BASIC 1 2 ( ) 2 ( ) ( ) ( ) (A.2.1 ) 1

2 8 BASIC (4) WWW   Taylor BASIC 1 2 ( ) 2 ( ) ( ) ( ) (A.2.1 ) 1 2 8 BASIC (4) 203 6 5 WWW http://www.math.meiji.ac.jp/~mk/syori2-203/ Taylor BASIC 2 ( ) 2 ( ) ( ) ( ) 2 (A.2. ) 6B 2 2. f a f(x) = f (n) (a) n! (x a) n = f(a)+f (a)(x a)+ f (a) 2 (x a) 2 + + f (n) (a)

More information

joho12.ppt

joho12.ppt n φ 1 (x),φ 2 (x),,φ n (x) (x i, f i ) Q n c 1,,c n (,f k ) q n = c i φ i (x) x Q n i=1 c 1 = 0 c 1 n ( c 1 ) = q n f k 2 Q n ( c 1 ) = q 2 2 n ( ) 2 f k q n ( ) + f k Q n c 1 = c 1 q n 2 q n( ) q n q

More information

3. :, c, ν. 4. Burgers : t + c x = ν 2 u x 2, (3), ν. 5. : t + u x = ν 2 u x 2, (4), c. 2 u t 2 = c2 2 u x 2, (5) (1) (4), (1 Navier Stokes,., ν. t +

3. :, c, ν. 4. Burgers : t + c x = ν 2 u x 2, (3), ν. 5. : t + u x = ν 2 u x 2, (4), c. 2 u t 2 = c2 2 u x 2, (5) (1) (4), (1 Navier Stokes,., ν. t + B: 2016 12 2, 9, 16, 2017 1 6 1,.,,,,.,.,,,., 1,. 1. :, ν. 2. : t = ν 2 u x 2, (1), c. t + c x = 0, (2). e-mail: iwayama@kobe-u.ac.jp,. 1 3. :, c, ν. 4. Burgers : t + c x = ν 2 u x 2, (3), ν. 5. : t +

More information

., a = < < < n < n = b, j = f j j =,,, n, C P,, P,,, P n n, n., P P P n = = n j= n j= j j + j j + { j j / j j } j j, j j / j j f j 3., n., Oa, b r > P

., a = < < < n < n = b, j = f j j =,,, n, C P,, P,,, P n n, n., P P P n = = n j= n j= j j + j j + { j j / j j } j j, j j / j j f j 3., n., Oa, b r > P . ϵριµϵτρoζ perimetros 76 Jones, Euler. =.,.,,,, C, C n+ P, P,, P n P, P n P n, P P P P n P n n P n,, C P, P j P j j =,,, n P n P., C.,, C. f [a, b], f. C = f a b, C l l = b a + f d P j P j a b j j j j

More information

0104.pages

0104.pages 0 5 9 07 0 bit 8, 6, 3 bit byte = 8 bit, char (C )BYTEFORTRAN) 055, -87 word = 6 bit int (C) INTEGER (FORTRAN) -3,7683,767 unsgined int (C) 065,535 double word = 3 bit, longint (C )-,47,483,648,47,483,647

More information

1 (bit ) ( ) PC WS CPU IEEE754 standard ( 24bit) ( 53bit)

1 (bit ) ( ) PC WS CPU IEEE754 standard ( 24bit) ( 53bit) GNU MP BNCpack tkouya@cs.sist.ac.jp 2002 9 20 ( ) Linux Conference 2002 1 1 (bit ) ( ) PC WS CPU IEEE754 standard ( 24bit) ( 53bit) 10 2 2 3 4 5768:9:; = %? @BADCEGFH-I:JLKNMNOQP R )TSVU!" # %$ & " #

More information

Microsoft PowerPoint - sales2.ppt

Microsoft PowerPoint - sales2.ppt 最適化とは何? CPU アーキテクチャに沿った形で最適な性能を抽出できるようにする技法 ( 性能向上技法 ) コンパイラによるプログラム最適化 コンパイラメーカの技量 経験量に依存 最適化ツールによるプログラム最適化 KAP (Kuck & Associates, Inc. ) 人によるプログラム最適化 アーキテクチャのボトルネックを知ること 3 使用コンパイラによる性能の違い MFLOPS 90

More information

44 4 I (1) ( ) (10 15 ) ( 17 ) ( 3 1 ) (2)

44 4 I (1) ( ) (10 15 ) ( 17 ) ( 3 1 ) (2) (1) I 44 II 45 III 47 IV 52 44 4 I (1) ( ) 1945 8 9 (10 15 ) ( 17 ) ( 3 1 ) (2) 45 II 1 (3) 511 ( 451 1 ) ( ) 365 1 2 512 1 2 365 1 2 363 2 ( ) 3 ( ) ( 451 2 ( 314 1 ) ( 339 1 4 ) 337 2 3 ) 363 (4) 46

More information

i ii i iii iv 1 3 3 10 14 17 17 18 22 23 28 29 31 36 37 39 40 43 48 59 70 75 75 77 90 95 102 107 109 110 118 125 128 130 132 134 48 43 43 51 52 61 61 64 62 124 70 58 3 10 17 29 78 82 85 102 95 109 iii

More information

Gauss

Gauss 15 1 LU LDL T 6 : 1g00p013-5 1 6 1.1....................................... 7 1.2.................................. 8 1.3.................................. 8 2 Gauss 9 2.1.....................................

More information

ex01.dvi

ex01.dvi ,. 0. 0.0. C () /******************************* * $Id: ex_0_0.c,v.2 2006-04-0 3:37:00+09 naito Exp $ * * 0. 0.0 *******************************/ #include int main(int argc, char **argv) double

More information

[ 1] 1 Hello World!! 1 #include <s t d i o. h> 2 3 int main ( ) { 4 5 p r i n t f ( H e l l o World!! \ n ) ; 6 7 return 0 ; 8 } 1:

[ 1] 1 Hello World!! 1 #include <s t d i o. h> 2 3 int main ( ) { 4 5 p r i n t f ( H e l l o World!! \ n ) ; 6 7 return 0 ; 8 } 1: 005 9 7 1 1.1 1 Hello World!! 5 p r i n t f ( H e l l o World!! \ n ) ; 7 return 0 ; 8 } 1: 1 [ ] Hello World!! from Akita National College of Technology. 1 : 5 p r i n t f ( H e l l o World!! \ n ) ;

More information

1 return main() { main main C 1 戻り値の型 関数名 引数 関数ブロックをあらわす中括弧 main() 関数の定義 int main(void){ printf("hello World!!\n"); return 0; 戻り値 1: main() 2.2 C main

1 return main() { main main C 1 戻り値の型 関数名 引数 関数ブロックをあらわす中括弧 main() 関数の定義 int main(void){ printf(hello World!!\n); return 0; 戻り値 1: main() 2.2 C main C 2007 5 29 C 1 11 2 2.1 main() 1 FORTRAN C main() main main() main() 1 return 1 1 return main() { main main C 1 戻り値の型 関数名 引数 関数ブロックをあらわす中括弧 main() 関数の定義 int main(void){ printf("hello World!!\n"); return

More information

ex01.dvi

ex01.dvi ,. 0. 0.0. C () /******************************* * $Id: ex_0_0.c,v.2 2006-04-0 3:37:00+09 naito Exp $ * * 0. 0.0 *******************************/ #include int main(int argc, char **argv) { double

More information

C による数値計算法入門 ( 第 2 版 ) 新装版 サンプルページ この本の定価 判型などは, 以下の URL からご覧いただけます. このサンプルページの内容は, 新装版 1 刷発行時のものです.

C による数値計算法入門 ( 第 2 版 ) 新装版 サンプルページ この本の定価 判型などは, 以下の URL からご覧いただけます.  このサンプルページの内容は, 新装版 1 刷発行時のものです. C による数値計算法入門 ( 第 2 版 ) 新装版 サンプルページ この本の定価 判型などは, 以下の URL からご覧いただけます. http://www.morikita.co.jp/books/mid/009383 このサンプルページの内容は, 新装版 1 刷発行時のものです. i 2 22 2 13 ( ) 2 (1) ANSI (2) 2 (3) Web http://www.morikita.co.jp/books/mid/009383

More information

2 4 BASIC (4) WWW BASIC 1 2 ( ) ( ) 1.2 3B 5 14 ( ) ( ) 3 1 1

2 4 BASIC (4) WWW   BASIC 1 2 ( ) ( ) 1.2 3B 5 14 ( ) ( ) 3 1 1 2 4 BASIC (4 2007 5 8 WWW http://www.math.meiji.ac.jp/~mk/syori2-2007/ BASIC 2 (. (5 5 3.2 3B 5 4 ( 5 5 5 2 ( 3 ( PAINT PAINT ( MAT PLOT AREA.3 : MAT PLOT AREA PAINT ( BASIC (.3. MAT PLOT AREA REM testmatplotarea.bas

More information

(Basic Theory of Information Processing) Fortran Fortan Fortan Fortan 1

(Basic Theory of Information Processing) Fortran Fortan Fortan Fortan 1 (Basic Theory of Information Processing) Fortran Fortan Fortan Fortan 1 17 Fortran Formular Tranlator Lapack Fortran FORTRAN, FORTRAN66, FORTRAN77, FORTRAN90, FORTRAN95 17.1 A Z ( ) 0 9, _, =, +, -, *,

More information

c-all.dvi

c-all.dvi III(994) (994) from PSL (9947) & (9922) c (99,992,994,996) () () 2 3 4 (2) 2 Euler 22 23 Euler 24 (3) 3 32 33 34 35 Poisson (4) 4 (5) 5 52 ( ) 2 Turbo 2 d 2 y=dx 2 = y y = a sin x + b cos x x = y = Fortran

More information

3. :, c, ν. 4. Burgers : u t + c u x = ν 2 u x 2, (3), ν. 5. : u t + u u x = ν 2 u x 2, (4), c. 2 u t 2 = c2 2 u x 2, (5) (1) (4), (1 Navier Stokes,.,

3. :, c, ν. 4. Burgers : u t + c u x = ν 2 u x 2, (3), ν. 5. : u t + u u x = ν 2 u x 2, (4), c. 2 u t 2 = c2 2 u x 2, (5) (1) (4), (1 Navier Stokes,., B:,, 2017 12 1, 8, 15, 22 1,.,,,,.,.,,,., 1,. 1. :, ν. 2. : u t = ν 2 u x 2, (1), c. u t + c u x = 0, (2), ( ). 1 3. :, c, ν. 4. Burgers : u t + c u x = ν 2 u x 2, (3), ν. 5. : u t + u u x = ν 2 u x 2,

More information

[1] #include<stdio.h> main() { printf("hello, world."); return 0; } (G1) int long int float ± ±

[1] #include<stdio.h> main() { printf(hello, world.); return 0; } (G1) int long int float ± ± [1] #include printf("hello, world."); (G1) int -32768 32767 long int -2147483648 2147483647 float ±3.4 10 38 ±3.4 10 38 double ±1.7 10 308 ±1.7 10 308 char [2] #include int a, b, c, d,

More information

0104.pages

0104.pages bit 8, 6, 3 bit byte = 8 bit, char CBYTEFORTRAN) 055, -87 word = 6 bit int (C) INTEGER (FORTRAN) -37683767 unsgined int (C) 065535 double word = 3 bit, longint C -4748364847483647 CD-audio 6 bit, 44. kbpsch74

More information

08 p Boltzmann I P ( ) principle of equal probability P ( ) g ( )g ( 0 ) (4 89) (4 88) eq II 0 g ( 0 ) 0 eq Taylor eq (4 90) g P ( ) g ( ) g ( 0

08 p Boltzmann I P ( ) principle of equal probability P ( ) g ( )g ( 0 ) (4 89) (4 88) eq II 0 g ( 0 ) 0 eq Taylor eq (4 90) g P ( ) g ( ) g ( 0 08 p. 8 4 k B log g() S() k B : Boltzmann T T S k B g g heat bath, thermal reservoir... 4. I II II System I System II II I I 0 + 0 const. (4 85) g( 0 ) g ( )g ( ) g ( )g ( 0 ) (4 86) g ( )g ( 0 ) 0 (4

More information

untitled

untitled 2 (numerical algorithm) 2. = ratio of the circumference to its diameter, number, Ludolph s number... sin, cos =3.45926535... 0 e x2 dx = /2 etc. : 999 : 99 : 974 P.: 973, J.-P.: 200 J. Arndt, Ch. Haenel:

More information

AHPを用いた大相撲の新しい番付編成

AHPを用いた大相撲の新しい番付編成 5304050 2008/2/15 1 2008/2/15 2 42 2008/2/15 3 2008/2/15 4 195 2008/2/15 5 2008/2/15 6 i j ij >1 ij ij1/>1 i j i 1 ji 1/ j ij 2008/2/15 7 1 =2.01/=0.5 =1.51/=0.67 2008/2/15 8 1 2008/2/15 9 () u ) i i i

More information

no35.dvi

no35.dvi p.16 1 sin x, cos x, tan x a x a, a>0, a 1 log a x a III 2 II 2 III III [3, p.36] [6] 2 [3, p.16] sin x sin x lim =1 ( ) [3, p.42] x 0 x ( ) sin x e [3, p.42] III [3, p.42] 3 3.1 5 8 *1 [5, pp.48 49] sin

More information

11042 計算機言語7回目 サポートページ:

11042 計算機言語7回目  サポートページ: 11042 7 :https://goo.gl/678wgm November 27, 2017 10/2 1(print, ) 10/16 2(2, ) 10/23 (3 ) 10/31( ),11/6 (4 ) 11/13,, 1 (5 6 ) 11/20,, 2 (5 6 ) 11/27 (7 12/4 (9 ) 12/11 1 (10 ) 12/18 2 (10 ) 12/25 3 (11

More information

sim0004.dvi

sim0004.dvi 4 : 1 f(x) Z b a dxf(x) (1) ( Double Exponential method=de ) 1 DE N = n T n h h =(b a)=n T n = b a f(a) +f(b) n f + f(a + j b a n )g n j=1 = b a f(a) +f(b) n f + f(a +j b a )g; n n+1 j=1 T n+1 = b a f(a)

More information

num2.dvi

num2.dvi kanenko@mbk.nifty.com http://kanenko.a.la9.jp/ 16 32...... h 0 h = ε () 0 ( ) 0 1 IEEE754 (ieee754.c Kerosoft Ltd.!) 1 2 : OS! : WindowsXP ( ) : X Window xcalc.. (,.) C double 10,??? 3 :, ( ) : BASIC,

More information

ストリーミング SIMD 拡張命令2 (SSE2) を使用した SAXPY/DAXPY

ストリーミング SIMD 拡張命令2 (SSE2) を使用した SAXPY/DAXPY SIMD 2(SSE2) SAXPY/DAXPY 2.0 2000 7 : 248600J-001 01/12/06 1 305-8603 115 Fax: 0120-47-8832 * Copyright Intel Corporation 1999, 2000 01/12/06 2 1...5 2 SAXPY DAXPY...5 2.1 SAXPY DAXPY...6 2.1.1 SIMD C++...6

More information

(ii) (iii) z a = z a =2 z a =6 sin z z a dz. cosh z z a dz. e z dz. (, a b > 6.) (z a)(z b) 52.. (a) dz, ( a = /6.), (b) z =6 az (c) z a =2 53. f n (z

(ii) (iii) z a = z a =2 z a =6 sin z z a dz. cosh z z a dz. e z dz. (, a b > 6.) (z a)(z b) 52.. (a) dz, ( a = /6.), (b) z =6 az (c) z a =2 53. f n (z B 4 24 7 9 ( ) :,..,,.,. 4 4. f(z): D C: D a C, 2πi C f(z) dz = f(a). z a a C, ( ). (ii), a D, a U a,r D f. f(z) = A n (z a) n, z U a,r, n= A n := 2πi C f(ζ) dζ, n =,,..., (ζ a) n+, C a D. (iii) U a,r

More information

1F90/kouhou_hf90.dvi

1F90/kouhou_hf90.dvi Fortran90 3 33 1 2 Fortran90 FORTRAN 1956 IBM IBM704 FORTRAN(FORmula TRANslation ) 1965 FORTRAN66 1978 FORTRAN77 1991 Fortran90 Fortran90 Fortran Fortran90 6 Fortran90 77 90 90 Fortran90 [ ] Fortran90

More information

imai@eng.kagawa-u.ac.jp No1 No2 OS Wintel Intel x86 CPU No3 No4 8bit=2 8 =256(Byte) 16bit=2 16 =65,536(Byte)=64KB= 6 5 32bit=2 32 =4,294,967,296(Byte)=4GB= 43 64bit=2 64 =18,446,744,073,709,551,615(Byte)=16EB

More information

. a, b, c, d b a ± d bc ± ad = c ac b a d c = bd ac b a d c = bc ad n m nm [2][3] BASIC [4] B BASIC [5] BASIC Intel x * IEEE a e d

. a, b, c, d b a ± d bc ± ad = c ac b a d c = bd ac b a d c = bc ad n m nm [2][3] BASIC [4] B BASIC [5] BASIC Intel x * IEEE a e d 3 3 BASIC C++ 8 Tflop/s 8TB [] High precision symmetric eigenvalue computation through exact tridiagonalization by using rational number arithmetic Hikaru Samukawa Abstract: Since rational number arithmetic,

More information

並列計算の数理とアルゴリズム サンプルページ この本の定価 判型などは, 以下の URL からご覧いただけます. このサンプルページの内容は, 初版 1 刷発行時のものです.

並列計算の数理とアルゴリズム サンプルページ この本の定価 判型などは, 以下の URL からご覧いただけます.  このサンプルページの内容は, 初版 1 刷発行時のものです. 並列計算の数理とアルゴリズム サンプルページ この本の定価 判型などは, 以下の URL からご覧いただけます. http://www.morikita.co.jp/books/mid/080711 このサンプルページの内容は, 初版 1 刷発行時のものです. Calcul scientifique parallèle by Frédéric Magoulès and François-Xavier

More information

MBLAS¤ÈMLAPACK; ¿ÇÜĹÀºÅÙÈǤÎBLAS/LAPACK¤ÎºîÀ®

MBLAS¤ÈMLAPACK; ¿ÇÜĹÀºÅÙÈǤÎBLAS/LAPACK¤ÎºîÀ® MBLAS MLAPACK; BLAS/LAPACK maho@riken.jp February 23, 2009 MPACK(MBLAS/MLAPACK) ( ) (2007 ) ( ) http://accc.riken.jp/maho/ BLAS/LAPACK http://mplapack.sourceforge.net/ BLAS (Basic Linear Algebra Subprograms)

More information

ープのロープ長以下であれば実現可能である ケース 3: 3 本のロープの杭の位置を点 P 1 = (x 1, y 1, 0), 点 P 2 = (x 2, y 2, 0), 点 P 3 = (x 3, y 3, 0) とする 点 P 1 = (x 1, y 1, 0), 点 P 2 = (x 2,

ープのロープ長以下であれば実現可能である ケース 3: 3 本のロープの杭の位置を点 P 1 = (x 1, y 1, 0), 点 P 2 = (x 2, y 2, 0), 点 P 3 = (x 3, y 3, 0) とする 点 P 1 = (x 1, y 1, 0), 点 P 2 = (x 2, ACM ICPC2013 国内予選問題 E つながれた風船 風船が最も高くあがるケースとして 1. 一本のロープが垂直に延びて他の2 本は緩んでいる 2. 二本のロープがピンと張っており残りの1 本は緩んでいる 3. 三本のロープともピンとはっているの三つのケースが考えられる ロープの本数は高々 10 本なので ケース1 は高々 10 9C2=360 通り ケース2も高々 10C2 8=360 通り

More information

1 I

1 I 1 I 3 1 1.1 R x, y R x + y R x y R x, y, z, a, b R (1.1) (x + y) + z = x + (y + z) (1.2) x + y = y + x (1.3) 0 R : 0 + x = x x R (1.4) x R, 1 ( x) R : x + ( x) = 0 (1.5) (x y) z = x (y z) (1.6) x y =

More information

AutoTuned-RB

AutoTuned-RB ABCLib Working Notes No.10 AutoTuned-RB Version 1.00 AutoTuned-RB AutoTuned-RB RB_DGEMM RB_DGEMM ( TransA, TransB, M, N, K, a, A, lda, B, ldb, b, C, ldc ) L3BLAS DGEMM (C a Trans(A) Trans(B) b C) (1) TransA:

More information

三石貴志.indd

三石貴志.indd 流通科学大学論集 - 経済 情報 政策編 - 第 21 巻第 1 号,23-33(2012) SIRMs SIRMs Fuzzy fuzzyapproximate approximatereasoning reasoningusing using Lukasiewicz Łukasiewicz logical Logical operations Operations Takashi Mitsuishi

More information

cm H.11.3 P.13 2 3-106-

cm H.11.3 P.13 2 3-106- H11.3 H.11.3 P.4-105- cm H.11.3 P.13 2 3-106- 2 H.11.3 P.47 H.11.3 P.27 i vl1 vl2-107- 3 h vl l1 l2 1 2 0 ii H.11.3 P.49 2 iii i 2 vl1 vl2-108- H.11.3 P.50 ii 2 H.11.3 P.52 cm -109- H.11.3 P.44 S S H.11.3

More information

num3.dvi

num3.dvi kanenko@mbk.nifty.com http://kanenko.a.la9.jp/ ,, ( ) Taylor. ( 1) i )x 2i+1 sinx = (2i+1)! i=0 S=0.0D0 T=X; /* */ DO 100 I=1,N S=S+T /* */ T=-T*X*X/(I+I+2)/(I+I+3) /* */ 100 CONTINUE. S=S+(-1)**I*X**(2*i+1)/KAIJO(2*I+1).

More information

( ) a C n ( R n ) R a R C n. a C n (or R n ) a 0 2. α C( R ) a C n αa = α a 3. a, b C n a + b a + b ( ) p 8..2 (p ) a = [a a n ] T C n p n a

( ) a C n ( R n ) R a R C n. a C n (or R n ) a 0 2. α C( R ) a C n αa = α a 3. a, b C n a + b a + b ( ) p 8..2 (p ) a = [a a n ] T C n p n a 9 8 m n mn N.J.Nigham, Accuracy and Stability of Numerical Algorithms 2nd ed., (SIAM) x x = x2 + y 2 = x + y = max( x, y ) x y x () (norm) (condition number) 8. R C a, b C a b 0 a, b a = a 0 0 0 n C n

More information

OpenMP (1) 1, 12 1 UNIX (FUJITSU GP7000F model 900), 13 1 (COMPAQ GS320) FUJITSU VPP5000/64 1 (a) (b) 1: ( 1(a))

OpenMP (1) 1, 12 1 UNIX (FUJITSU GP7000F model 900), 13 1 (COMPAQ GS320) FUJITSU VPP5000/64 1 (a) (b) 1: ( 1(a)) OpenMP (1) 1, 12 1 UNIX (FUJITSU GP7000F model 900), 13 1 (COMPAQ GS320) FUJITSU VPP5000/64 1 (a) (b) 1: ( 1(a)) E-mail: {nanri,amano}@cc.kyushu-u.ac.jp 1 ( ) 1. VPP Fortran[6] HPF[3] VPP Fortran 2. MPI[5]

More information

Second-semi.PDF

Second-semi.PDF PC 2000 2 18 2 HPC Agenda PC Linux OS UNIX OS Linux Linux OS HPC 1 1CPU CPU Beowulf PC (PC) PC CPU(Pentium ) Beowulf: NASA Tomas Sterling Donald Becker 2 (PC ) Beowulf PC!! Linux Cluster (1) Level 1:

More information

メタコンピュータ構成方式の研究

メタコンピュータ構成方式の研究 : ( ) Internet, Computational Resources, , MPI, PVM - RPC, (ORB),, Java (JVM) Java?,, code verification & sand box Java JIT Java (JVM) : Java (, ) cf., disconnected operation - Java MobaThread.goTo( );

More information

i

i 14 i ii iii iv v vi 14 13 86 13 12 28 14 16 14 15 31 (1) 13 12 28 20 (2) (3) 2 (4) (5) 14 14 50 48 3 11 11 22 14 15 10 14 20 21 20 (1) 14 (2) 14 4 (3) (4) (5) 12 12 (6) 14 15 5 6 7 8 9 10 7

More information

9. 05 L x P(x) P(0) P(x) u(x) u(x) (0 < = x < = L) P(x) E(x) A(x) P(L) f ( d EA du ) = 0 (9.) dx dx u(0) = 0 (9.2) E(L)A(L) du (L) = f (9.3) dx (9.) P

9. 05 L x P(x) P(0) P(x) u(x) u(x) (0 < = x < = L) P(x) E(x) A(x) P(L) f ( d EA du ) = 0 (9.) dx dx u(0) = 0 (9.2) E(L)A(L) du (L) = f (9.3) dx (9.) P 9 (Finite Element Method; FEM) 9. 9. P(0) P(x) u(x) (a) P(L) f P(0) P(x) (b) 9. P(L) 9. 05 L x P(x) P(0) P(x) u(x) u(x) (0 < = x < = L) P(x) E(x) A(x) P(L) f ( d EA du ) = 0 (9.) dx dx u(0) = 0 (9.2) E(L)A(L)

More information

第7章 有限要素法のプログラミング

第7章 有限要素法のプログラミング April 3, 2019 1 / 34 7.1 ( ) 2 Poisson 2 / 34 7.2 femfp.c [1] main( ) input( ) assem( ) ecm( ) f( ) solve( ) gs { solve( ) output( ) 3 / 34 7.3 fopen() #include FILE *fopen(char *fname, char

More information

12.pptx

12.pptx 数値解析 第 1 回 15 年 7 月 8 日 水 ) 理学部物理学科情報理学コース 1 講義内容 1. 非線形方程式の数値解法 1.1 はじめに 1. 分法 1.3 補間法 1.4 ニュートン法 1.4.1 多変数問題への応用 1.4. ニュートン法の収束性. 連立 1 次方程式の解法.1 序論と行列計算の基礎. ガウスの消去法.3 3 重対角行列の場合の解法.4 LU 分解法.5 特異値分解法.6

More information

#define N1 N+1 double x[n1] =.5, 1., 2.; double hokan[n1] = 1.65, 2.72, 7.39 ; double xx[]=.2,.4,.6,.8,1.2,1.4,1.6,1.8; double lagrng(double xx); main

#define N1 N+1 double x[n1] =.5, 1., 2.; double hokan[n1] = 1.65, 2.72, 7.39 ; double xx[]=.2,.4,.6,.8,1.2,1.4,1.6,1.8; double lagrng(double xx); main =1= (.5, 1.65), (1., 2.72), (2., 7.39).2,.4,.6,.8, 1., 1.2, 1.4, 1.6 1 1: x.2 1.4128.4 1.5372.6 1.796533.8 2.198 1.2 3.384133 1.4 4.1832 1.6 5.1172 8 7 6 5 y 4 3 2 1.5 1 1.5 2 x 1: /* */ #include

More information

di-problem.dvi

di-problem.dvi 005/05/05 by. I : : : : : : : : : : : : : : : : : : : : : : : : :. II : : : : : : : : : : : : : : : : : : : : : : : : : 3 3. III : : : : : : : : : : : : : : : : : : : : : : : : 4 4. : : : : : : : : : :

More information

第1部 一般的コメント

第1部 一般的コメント (( 2000 11 24 2003 12 31 3122 94 2332 508 26 a () () i ii iii iv (i) (ii) (i) (ii) (iii) (iv) (a) (b)(c)(d) a) / (i) (ii) (iii) (iv) 1996 7 1996 12

More information

MPI usage

MPI usage MPI (Version 0.99 2006 11 8 ) 1 1 MPI ( Message Passing Interface ) 1 1.1 MPI................................. 1 1.2............................... 2 1.2.1 MPI GATHER.......................... 2 1.2.2

More information

. (.8.). t + t m ü(t + t) + c u(t + t) + k u(t + t) = f(t + t) () m ü f. () c u k u t + t u Taylor t 3 u(t + t) = u(t) + t! u(t) + ( t)! = u(t) + t u(

. (.8.). t + t m ü(t + t) + c u(t + t) + k u(t + t) = f(t + t) () m ü f. () c u k u t + t u Taylor t 3 u(t + t) = u(t) + t! u(t) + ( t)! = u(t) + t u( 3 8. (.8.)............................................................................................3.............................................4 Nermark β..........................................

More information

1. A0 A B A0 A : A1,...,A5 B : B1,...,B

1. A0 A B A0 A : A1,...,A5 B : B1,...,B 1. A0 A B A0 A : A1,...,A5 B : B1,...,B12 2. 3. 4. 5. A0 A B f : A B 4 (i) f (ii) f (iii) C 2 g, h: C A f g = f h g = h (iv) C 2 g, h: B C g f = h f g = h 4 (1) (i) (iii) (2) (iii) (i) (3) (ii) (iv) (4)

More information

2009 I 2 II III 14, 15, α β α β l 0 l l l l γ (1) γ = αβ (2) α β n n cos 2k n n π sin 2k n π k=1 k=1 3. a 0, a 1,..., a n α a

2009 I 2 II III 14, 15, α β α β l 0 l l l l γ (1) γ = αβ (2) α β n n cos 2k n n π sin 2k n π k=1 k=1 3. a 0, a 1,..., a n α a 009 I II III 4, 5, 6 4 30. 0 α β α β l 0 l l l l γ ) γ αβ ) α β. n n cos k n n π sin k n π k k 3. a 0, a,..., a n α a 0 + a x + a x + + a n x n 0 ᾱ 4. [a, b] f y fx) y x 5. ) Arcsin 4) Arccos ) ) Arcsin

More information

第1章 国民年金における無年金

第1章 国民年金における無年金 1 2 3 4 ILO ILO 5 i ii 6 7 8 9 10 ( ) 3 2 ( ) 3 2 2 2 11 20 60 12 1 2 3 4 5 6 7 8 9 10 11 12 13 13 14 15 16 17 14 15 8 16 2003 1 17 18 iii 19 iv 20 21 22 23 24 25 ,,, 26 27 28 29 30 (1) (2) (3) 31 1 20

More information

¥Ñ¥Ã¥±¡¼¥¸ Rhpc ¤Î¾õ¶·

¥Ñ¥Ã¥±¡¼¥¸ Rhpc ¤Î¾õ¶· Rhpc COM-ONE 2015 R 27 12 5 1 / 29 1 2 Rhpc 3 forign MPI 4 Windows 5 2 / 29 1 2 Rhpc 3 forign MPI 4 Windows 5 3 / 29 Rhpc, R HPC Rhpc, ( ), snow..., Rhpc worker call Rhpc lapply 4 / 29 1 2 Rhpc 3 forign

More information

x y x-y σ x + τ xy + X σ y B = + τ xy + Y B = S x = σ x l + τ xy m S y = σ y m + τ xy l σ x σ y τ xy X B Y B S x S y l m δu δv [ ( σx δu + τ )

x y x-y σ x + τ xy + X σ y B = + τ xy + Y B = S x = σ x l + τ xy m S y = σ y m + τ xy l σ x σ y τ xy X B Y B S x S y l m δu δv [ ( σx δu + τ ) 1 8 6 No-tension 1. 1 1.1................................ 1 1............................................ 5.1 - [B].................................. 5................................. 6.3..........................................

More information

numb.dvi

numb.dvi 11 Poisson kanenko@mbkniftycom alexeikanenko@docomonejp http://wwwkanenkocom/ , u = f, ( u = u+f u t, u = f t ) 1 D R 2 L 2 (D) := {f(x,y) f(x,y) 2 dxdy < )} D D f,g L 2 (D) (f,g) := f(x,y)g(x,y)dxdy (L

More information

1

1 1 1 7 1.1.................................. 11 2 13 2.1............................ 13 2.2............................ 17 2.3.................................. 19 3 21 3.1.............................

More information

4 2016 3 8 2.,. 2. Arakawa Jacobin., 2 Adams-Bashforth. Re = 80, 90, 100.. h l, h/l, Kármán, h/l 0.28,, h/l.., (2010), 46.2., t = 100 t = 2000 46.2 < Re 46.5. 1 1 4 2 6 2.1............................

More information

II ( ) (7/31) II ( [ (3.4)] Navier Stokes [ (6/29)] Navier Stokes 3 [ (6/19)] Re

II ( ) (7/31) II (  [ (3.4)] Navier Stokes [ (6/29)] Navier Stokes 3 [ (6/19)] Re II 29 7 29-7-27 ( ) (7/31) II (http://www.damp.tottori-u.ac.jp/~ooshida/edu/fluid/) [ (3.4)] Navier Stokes [ (6/29)] Navier Stokes 3 [ (6/19)] Reynolds [ (4.6), (45.8)] [ p.186] Navier Stokes I Euler Navier

More information

表1票4.qx4

表1票4.qx4 iii iv v 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 22 23 10 11 24 25 26 27 10 56 28 11 29 30 12 13 14 15 16 17 18 19 2010 2111 22 23 2412 2513 14 31 17 32 18 33 19 34 20 35 21 36 24 37 25 38 2614

More information

C言語によるアルゴリズムとデータ構造

C言語によるアルゴリズムとデータ構造 Algorithms and Data Structures in C 4 algorithm List - /* */ #include List - int main(void) { int a, b, c; int max; /* */ Ÿ 3Ÿ 2Ÿ 3 printf(""); printf(""); printf(""); scanf("%d", &a); scanf("%d",

More information

1 (1) (2)

1 (1) (2) 1 2 (1) (2) (3) 3-78 - 1 (1) (2) - 79 - i) ii) iii) (3) (4) (5) (6) - 80 - (7) (8) (9) (10) 2 (1) (2) (3) (4) i) - 81 - ii) (a) (b) 3 (1) (2) - 82 - - 83 - - 84 - - 85 - - 86 - (1) (2) (3) (4) (5) (6)

More information

- 2 -

- 2 - - 2 - - 3 - (1) (2) (3) (1) - 4 - ~ - 5 - (2) - 6 - (1) (1) - 7 - - 8 - (i) (ii) (iii) (ii) (iii) (ii) 10 - 9 - (3) - 10 - (3) - 11 - - 12 - (1) - 13 - - 14 - (2) - 15 - - 16 - (3) - 17 - - 18 - (4) -

More information

2 1980 8 4 4 4 4 4 3 4 2 4 4 2 4 6 0 0 6 4 2 4 1 2 2 1 4 4 4 2 3 3 3 4 3 4 4 4 4 2 5 5 2 4 4 4 0 3 3 0 9 10 10 9 1 1

2 1980 8 4 4 4 4 4 3 4 2 4 4 2 4 6 0 0 6 4 2 4 1 2 2 1 4 4 4 2 3 3 3 4 3 4 4 4 4 2 5 5 2 4 4 4 0 3 3 0 9 10 10 9 1 1 1 1979 6 24 3 4 4 4 4 3 4 4 2 3 4 4 6 0 0 6 2 4 4 4 3 0 0 3 3 3 4 3 2 4 3? 4 3 4 3 4 4 4 4 3 3 4 4 4 4 2 1 1 2 15 4 4 15 0 1 2 1980 8 4 4 4 4 4 3 4 2 4 4 2 4 6 0 0 6 4 2 4 1 2 2 1 4 4 4 2 3 3 3 4 3 4 4

More information

20 15 14.6 15.3 14.9 15.7 16.0 15.7 13.4 14.5 13.7 14.2 10 10 13 16 19 22 1 70,000 60,000 50,000 40,000 30,000 20,000 10,000 0 2,500 59,862 56,384 2,000 42,662 44,211 40,639 37,323 1,500 33,408 34,472

More information

I? 3 1 3 1.1?................................. 3 1.2?............................... 3 1.3!................................... 3 2 4 2.1........................................ 4 2.2.......................................

More information

z f(z) f(z) x, y, u, v, r, θ r > 0 z = x + iy, f = u + iv C γ D f(z) f(z) D f(z) f(z) z, Rm z, z 1.1 z = x + iy = re iθ = r (cos θ + i sin θ) z = x iy

z f(z) f(z) x, y, u, v, r, θ r > 0 z = x + iy, f = u + iv C γ D f(z) f(z) D f(z) f(z) z, Rm z, z 1.1 z = x + iy = re iθ = r (cos θ + i sin θ) z = x iy f f x, y, u, v, r, θ r > = x + iy, f = u + iv C γ D f f D f f, Rm,. = x + iy = re iθ = r cos θ + i sin θ = x iy = re iθ = r cos θ i sin θ x = + = Re, y = = Im i r = = = x + y θ = arg = arctan y x e i =

More information

&A : A = k j 1: 4-way., A set x, way y, way y LRU y, way., A (x,y).,,, L1( 1) L2, L3 3. L1., L2,L3., TLB(Translation Lookaside Buffer). OS,. TLB, ( ),

&A : A = k j 1: 4-way., A set x, way y, way y LRU y, way., A (x,y).,,, L1( 1) L2, L3 3. L1., L2,L3., TLB(Translation Lookaside Buffer). OS,. TLB, ( ), 1?,. 1,.,,. n-way (n ). 1, 4-way, n-way n (way).,., 1., ( set x ) (x), n., 2, 2 s, 2 l (, s, l )., s + l s., s,., n s. n. s + l way, (set,way)., way,. way, LRU(Least Recently Used, ). way. way, (,...).

More information

数学の基礎訓練I

数学の基礎訓練I I 9 6 13 1 1 1.1............... 1 1................ 1 1.3.................... 1.4............... 1.4.1.............. 1.4................. 3 1.4.3........... 3 1.4.4.. 3 1.5.......... 3 1.5.1..............

More information

2

2 2013 Vol.18 No.2 3 24 25 8 22 2 23 26 9 15 20 2 3 4 5 6 7 8 point1 point 2 point3 point4 10 11 point1 point 2 point 3 point 4 12 13 14 15 16 17 18 19 20 http://www.taishukan.co.jp/kateika/ 21 22 23 24

More information