6.3 Basic Linear Algebra Subprograms (BLAS1)

Size: px
Start display at page:

Download "6.3 Basic Linear Algebra Subprograms (BLAS1)"

Transcription

1 6.3 Basi Linear Algebra Subprograms (BLAS1) A. Purpose This is a set of subroutine and funtion subprograms for basi mathematial operations on a single vetor or a pair of vetors. The operations provided are those ommonly used in algorithms for numerial linear algebra problems, e.g., problems involving systems of equations, least-squares, matrix eigenvalues, optimization, et. B. Usage Desribed below under B.1 through B.13 are: B.1 Vetor Arguments B.2 Dot Produt SDOT, DDOT, CDOTC, CDOTU, DSDOT, SDSDOT B.3 Salar times a Vetor Plus a Vetor SAXPY, DAXPY, CAXPY B.4 Set up Givens Rotation SROTG, DROTG B.5 Apply Givens Rotation SROT, DROT B.6 Set up Modified Rotation SROTMG, DROTMG B.7 Apply Modified Rotation SROTM, DROTM.. 3 B.8 Copy X into Y SCOPY, DCOPY, CCOPY... 4 B.9 Swap X and Y SSWAP, DSWAP, CSWAP B.10 Eulidean Norm SNRM2, DNRM2, SCNRM B.11 Sum of Absolute Values SASUM, DASUM, SCASUM B.12 Constant Times a Vetor SSCAL, DSCAL, CSCAL, CSSCAL B.13 Index of Element Having Maximum Absolute Value ISAMAX, IDAMAX, ICAMAX B.1 Vetor Arguments For subprograms of this pakage a vetor is speified by three arguments, say N, SX, and INCX, where N denotes the number of elements in the vetor, SX (or DX or CX) the vetor, and identifies the array ontaining INCX is the (signed) storage inrement between suessive elements of the vetor. Let x i, i = 1,..., N, denote the vetor stored in the array SX(). Within a subprogram of this pakage the array argument, SX, will be delared as SX( ) In the ommon ase of INCX = 1, x i is stored in SX(i). More generally, if INCX 0, x i is stored in SX(1 + (i 1) INCX), and if INCX < 0, x i is stored in X(1 + (N i) INCX ) Calif. Inst. of Tehnology, 2015 Math à la Carte, In. With indexing as speified above, looping operations within the subprograms are performed in the order, 2,..., N. Only positive values of INCX are allowed for subprograms that have a single vetor argument. For subprograms having two vetor arguments, the two inrement parameters, INCX and INCY, may independently be positive, zero, or negative. Due to the Fortran 77 rules for argument assoiation and array storage, the atual argument playing the role of SX is not limited to being a singly dimensioned array. It may be an array of any number of dimensions, or it may be an array element with any number of subsripts. The standard does not permit this argument to be a simple variable, however. If the atual argument is an array element, i.e., a subsripted array name, then it identifies x 1, the first element of the vetor, if INCX 0, and x N, the last element of the vetor, if INCX < 0. The most ommon reason for using an inrement value different from one is to operate on a row of a matrix. For example, if an array is delared as A(5, 10) The third row of A(,) begins at element A(3,1) and has a storage spaing of 5 (double preision) storage loations between suessive elements. Thus this row-vetor of length 10 would be desribed by the parameter triple (N, DX, INCX) = (10, A(3,1), 5) in alls to subprograms of this pakage. See Setion C for examples illustrating the speifiations of vetor arguments. In the following subprogram desriptions we assume the following delarations have been made for any subprograms that use these variable names INTEGER N, INCX, INCY SX(mx), SY(my) COMPLEX CX(mx), CY(my) DX(mx), DY(my) In the ommon ase of INCX = 1, mx must satisfy mx N. More generally, mx must satisfy mx 1 + (N 1) INCX. Similarly, my must be onsistent with N and INCY. In Setions B.2 through B.13 we use the onvention that x denotes the vetor ontained in the storage array SX(), July 11, 2015 Basi Linear Algebra Subprograms (BLAS1) 6.3 1

2 DX(), or CX(), a denotes the salar value ontained in SA, DA, or CA, et. B.2 Dot Produt Subprograms SDOT, SDSDOT, SB, SW COMPLEX DDOT, DSDOT, DW CDOTC, CDOTU, CW The first four subprograms eah ompute w = x i y i Single preision: SW = SDOT(N, SX, INCX, SY, INCY) Double preision: DW = DDOT(N, DX, INCX, DY, INCY) Single preision data. Uses double preision arithmeti internally and returns a double preision result: DW = DSDOT(N, SX, INCX, SY, INCY) Complex (unonjugated): CW = CDOTU(N, CX, INCX, CY, INCY) CDOTC omputes w = x i y i where x i denotes the omplex onjugate of the given x i. This is the usual inner produt of omplex N-spae. CW = CDOTC(N, CX, INCX, CY, INCY) SDSDOT omputes w = b + x i y i using single preision data, double preision internal arithmeti, and onverting the final result to single preision: SW = SDSDOT(N, SB, SX, INCX, SY, INCY) In eah of the above six subprograms the value of the summation from 1 to N will be set to zero if N 0. B.3 Salar Times a Vetor Plus a Vetor SA COMPLEX CA DA Given a salar, a, and vetors, x and y, eah of these subroutines replaes y by ax + y. If a = 0 or N 0, eah subroutine returns, doing no omputation. Single preision: CALL SAXPY (N, SA, SX, INCX, SY, INCY) Double preision: CALL DAXPY (N, DA, DX, INCX, DY, INCY) Complex: CALL CAXPY (N, CA, CX, INCX, CY, INCY) B.4 Construt a Givens Plane Rotation SA, SB, SC, SS Single preision: Double preision: DA, DB, DC, DS CALL SROTG (SA, SB, SC, SS) CALL DROTG (DA, DB, DC, DS) Given a and b, eah of these subroutines omputes and s, satisfying s a r = s b 0 subjet to 2 + s 2 = 1 and r 2 = a 2 + b 2. Thus the matrix involving and s is an orthogonal (rotation) matrix that transforms the seond omponent of the vetor a, b t to zero. This matrix is used in ertain least-squares and eigenvalue algorithms. If r = 0 the subroutine sets = 1 and s = 0. Otherwise the sign of r is set so that sgn(r) = sgn(a) if a > b, and sgn(r) = sgn(b) if a b. Then, = a/r and s = b/r. Besides setting and s, the subroutine stores r in plae of a and another number, z, in plae of b. The number z is rarely needed. See 1 4 in Setion D for a desription of z. These subroutines are designed to avoid extraneous overflow or underflow in ases where r 2 is outside the exponent range of the omputer arithmeti but r is within the range Basi Linear Algebra Subprograms (BLAS1) July 11, 2015

3 B.5 Apply a Plane Rotation SC, SS Single preision: Double preision: DC, DS CALL SROT (N, SX, INCX, SY, INCY, SC, SS) CALL DROT (N, DX, INCX, DY, INCY, DC, DS) Given vetors, x and y, and salars, and s, this subroutine replaes the 2 N matrix x t y t by the 2 N matrix s s x t y t. If N 0 or if = 1 and s = 0, these subroutines return, doing no omputation. B.6 Construt a Modified Givens Transformation SD1, SD2, SX1, SX2, SPARAM(5) DPARAM(5) Single preision: Double preision: DD1, DD2, DX1, DX2, CALL SROTMG (SD1, SD2, SX1, SX2, SPARAM) CALL DROTMG (DD1, DD2, DX1, DX2, DPARAM) The input quantities d 1, d 2, x 1, and x 2, define a 2-vetor w 1 w 2 t in partitioned form as = w 2 w1 d 1/ d 1/2 2 x1. x 2 The subroutine determines the modified Givens rotation matrix H that transforms x 2 and thus w 2 to zero. It also replaes d 1, d 2, and x 1 with δ 1, δ 2, and ξ 1, respetively. These quantities satisfy ω 0 = = δ 1/ δ 1/2 2 δ 1/ δ 1/2 2 x1 H x 2 ξ1 0 with ω = ±(w w 2 2) 1/2. A representation of the matrix H will be stored by this subroutine into SPARAM() or DPARAM() for subsequent use by subroutines SROTM or DROTM. See the Appendix in 1 for more details on the omputation and storage of H. Most of the time the matrix H will be onstruted to have two elements equal to +1 or 1. Thus multipliation of a 2-vetor by H an be programmed to be faster than multipliation by a general 2 2 matrix. This is the motivation for using a modified Givens matrix rather than a standard Givens matrix; however, these matrix multipliations must represent a very signifiant perentage of the exeution time of an appliation program in order for the extra omplexity of using the modified Givens matrix to be worthwhile. B.7 Apply a Modified Givens Transformation SPARAM(5) Single preision: Double preision:, DPARAM(5) CALL SROTM (N, SX, INCX, SY, INCY, SPARAM) CALL DROTM (N, DX, INCX, DY, INCY, DPARAM) Given vetors, x and y, and a representation of an H matrix onstruted by SROTMG or DROTMG in SPARAM() or DPARAM(), this subroutine replaes the 2 N matrix x t y t x t by H y t. Due to the speial form of the matrix, H, this matrix multipliation generally requires only 2N multipliations and 2N additions rather than the 4N multipliations and 2N additions that would be required if H were an arbitrary 2 2 matrix. If N 0 or H is the identity matrix, these subroutines return immediately. July 11, 2015 Basi Linear Algebra Subprograms (BLAS1) 6.3 3

4 B.8 Copy a Vetor x to y Single preision: CALL SCOPY (N, SX, INCX, SY, INCY) Double preision: CALL DCOPY (N, DX, INCX, DY, INCY) Complex: CALL CCOPY (N, CX, INCX, CY, INCY) Eah of these subroutines opies the vetor x to y. If N 0 the subroutine returns immediately. B.9 Swap Vetors x and y Single preision: CALL SSWAP (N, SX, INCX, SY, INCY) Double preision: CALL DSWAP (N, DX, INCX, DY, INCY) Complex: CALL CSWAP (N, CX, INCX, CY, INCY) This subroutine interhanges the vetors x and y. If N 0, the subroutine returns immediately. B.10 Eulidean Norm of a Vetor SNRM2, SCNRM2, SW Single preision: Double preision: DNRM2, DW SW = SNRM2(N, SX, INCX) DW = DNRM2(N, DX, INCX) Complex data, result: SW = SCNRM2(N, CX, INCX) Eah of these subprograms omputes N 1/2 w = x i 2. If N 0, the result is set to zero. These subprograms are designed to avoid overflow or underflow in ases in whih w 2 is outside the exponent range of the omputer arithmeti but w is within the range. B.11 Sum of Magnitude of Vetor Components SASUM, SCASUM, SW SASUM and DASUM ompute w = x i. Single preision: Double preision: DASUM, DW SW = SASUM(N, SX, INCX) DW = DASUM(N, DX, INCX) Given a omplex vetor, x, SCASUM omputes a result for the expression: w = Rx i + Ix i. SW = SCASUM(N, CX, INCX) If N 0 these subprograms set the result to zero. B.12 Vetor Saling SA COMPLEX CA DA Given a salar, a, and vetor, x, eah of these subroutines replaes the vetor, x, by the produt ax. Single preision: CALL SSCAL (N, SA, SX, INCX) Double preision: Complex: CALL DSCAL (N, DA, DX, INCX) CALL CSCAL (N, CA, CX, INCX) Given a and omplex x, the subroutine CSSCAL replaes x by the produt ax. CALL CSSCAL (N, SA, CX, INCX) If N 0 these subroutines return immediately Basi Linear Algebra Subprograms (BLAS1) July 11, 2015

5 B.13 Find Vetor Component of Largest Magnitude INTEGER ISAMAX, IDAMAX, ICAMAX, IMAX ISAMAX and IDAMAX eah determine the smallest i suh that x i = max{ x j : j = 1,..., N} vetor, integer result: IMAX = ISAMAX(N, SX, INCX) Double preision vetor, integer result: IMAX = IDAMAX(N, DX, INCX) Given a omplex vetor, x, ICAMAX determines the smallest i suh that Rx i + Ix i = max{ Rx j + Ix j : j = 1,..., N} IMAX = ICAMAX(N, CX, INCX) If N 0, eah of these subprograms sets the integer result to zero. C. Examples and Remarks The program, DRDBLAS1, and its output, ODDBLAS1, illustrate the use of various BLAS1 subprograms to ompute matrix-vetor and matrix-matrix produts. Problems (1) and (2) show two ways of omputing the matrix-vetor produt, Ab. Using DDOT aesses the elements of A by rows. Using DAXPY aesses A by olumns. The olumn ordering has an effiieny advantage on virtual memory systems sine Fortran stores arrays by olumns and there will therefore be fewer page faults. Problem (3) illustrates multipliation by the transpose of a matrix without transposing the matrix in storage. Problem (4) illustrates matrix-matrix multipliation. This operation ould also be programmed to use DAXPY rather than DDOT. These examples also illustrate the feature that matrix dimensions and storage array dimensions need not be the same. Thus, in DRDBLAS1, a 2 3 matrix A is stored in a 5 10 storage array A(,). The program, DRDBLAS2, with output, ODDBLAS2, illustrates a omplete algorithm for solving a linear leastsquares problem. The algorithm first performs sequential aumulation of data into a triangular matrix, using DROTG and DROT to build and apply Givens orthogonal transformations. It then solves the triangular system using DCOPY and DAXPY. This is a very reliable algorithm. The problem solved is the determination of oeffiients 1, 2, and 3 in the expression x + 3 exp( x) to produe a least-squares fit to the data given in XTAB() and YTAB(). Note that by hanging dimension parameters, and the statements assigning values to the array W(), DRDBLAS2 ould be altered to solve any speifi linear least-squares problem. D. Funtional Desription This set of subprograms is desribed in more detail in 1. For disussion of the standard and modified Givens orthogonal transformations and their use in least-squares omputations see 5. There is an error in 1 in the disussion of the parameter, z, whih is returned by SROTG or DROTG. This error was orreted by 3, after whih 4 orreted an error in 3. Referenes 1. C. L. Lawson, R. J. Hanson, D. R. Kinaid, and F. T. Krogh, Basi Linear Algebra Subprograms for Fortran usage, ACM Trans. on Math. Software 5, 3 (Sept. 1979) C. L. Lawson, R. J. Hanson, D. R. Kinaid, and F. T. Krogh, Algorithm 539: Basi Linear Algebra Subprograms for Fortran usage F1, ACM Trans. on Math. Software 5, 3 (Sept. 1979) David S. Dodson and Roger G. Grimes, Remark on Algorithm 539: Basi Linear Algebra Subprograms for Fortran usage F1, ACM Trans. on Math. Software 8, 4 (De. 1982) David S. Dodson, Corrigendum: Remark on Algorithm 539: Basi Linear Algebra Subroutines for FOR- TRAN usage, ACM Trans. on Math. Software 9, 1 (Marh 1983) Charles L. Lawson and Rihard J. Hanson, Solving Least-Squares Problems, Prentie-Hall, Englewood Cliffs, N. J. (1974) 340 pages. 6. Fred T. Krogh, On the Use of Assembly Code for Heavily Used Modules in Linear Algebra. Internal Tehnial Memorandum 303, Jet Propulsion Laboratory, Pasadena, CA (May 1972). 7. R. Hanson, F. Krogh, and C. Lawson, A proposal for standard linear algebra subprograms. Internal Tehnial Memorandum , Jet Propulsion Laboratory (Nov. 1973). 8. Jak J. Dongarra, Jeremy Du Croz, Sven Hammarling, and Rihard J. Hanson, An extended set of FORTRAN Basi Linear Algebra Subprograms, ACM Trans. on Math. Software 14, 1 (Marh 1988) July 11, 2015 Basi Linear Algebra Subprograms (BLAS1) 6.3 5

6 9. Jak J. Dongarra, Jeremy Du Croz, Sven Hammarling, and Iain Duff, A set of level 3 Basi Linear Algebra Subprograms, ACM Trans. on Math. Software 16, 1 (Marh 1990) R. J. Hanson and F. T. Krogh, Algorithm 653: Translation of Algorithm 539: PC-BLAS Basi Linear Algebra Subprograms for FORTRAN usage with the INTEL 8087, numeri data proessor, ACM Trans. on Math. Software 13, 3 (Sept. 1987) E. Error Proedures and Restritions These subprograms do not issue any error messages. If INCX 0 in any of the subprograms having a single vetor argument the results are unpreditable. A value of N = 0 is a valid speial ase. Values of N < 0 are treated like N = 0. F. Supporting Information The soure language is ANSI Fortran 77. Eah program unit has a single entry with the same name as the program unit. No program units ontain external referenes. As a result of experiments done in 6, a BLAS-type pakage was originally proposed in 7. The pakage was subsequently developed and tested over the period as an ACM SIGNUM ommittee projet, with the final produt being announed in 1. This pakage was subsequently used as a omponent in many other numerial software pakages and optimized mahine-language versions were produed for a number of different omputer systems. This pakage was identified as BLAS when it appeared in , however it is now identified as BLAS1, or Level 1 BLAS sine publiation of BLAS2 8 for matrix-vetor operations and BLAS3 9 for matrixmatrix operations. These latter two pakages support more effiient use of vetor registers, proessor ahe, and parallel proessors than is possible in BLAS1. Adapted to Fortran 77, by C. Lawson and S. Chiu, JPL, January Replaed L2 norm routines with new versions whih avoid undeflow in all ases and whih don t use assigned go to s, F. Krogh, May All entries need one file of the same name, exept for DNRM2, SCNRM2, and SNRM2 all of whih also require AMACH. Entries CAXPY CCOPY CDOTC CDOTU CSCAL CSSCAL CSWAP DASUM DAXPY DCOPY DDOT DNRM2 DROT DROTG DROTM DROTMG DSCAL DSDOT DSWAP ICAMAX IDAMAX ISAMAX SASUM SAXPY SCASUM SCNRM2 SCOPY SDOT SDSDOT SNRM2 SROT SROTG SROTM SROTMG SSCAL SSWAP DRDBLAS1 program DRDBLAS1 >> DRDBLAS1 Krogh Minor format hange f o r C onversion. >> DRDBLAS1 Krogh Added e x t e r n a l statement. >> DRDBLAS1 Krogh Changes t o use M77CON >> DRDBLAS1 CLL Removed r e f e r e n e to DBLE( ) f u n t i o n. >> DRDBLAS1 CLL >> DRDBLAS1 CLL >> DRBLAS1 Lawson I n i t i a l Code. Demonstrate usage o f DAXPY, DCOPY, and DDOT from t h e BLAS by omputing (1) p = A b using DDOT (2) q = A b using DCOPY & DAXPY (3) r = (A Transposed ) p using DDOT (4) S = A E using DDOT D r e p l a e s? : DR?BLAS1,?AXPY,?COPY,?DOT external DDOT double preision DDOT integer M2, M3, M4, N2, N3, N4 parameter ( M2=5, M3=10, M4=12 ) Basi Linear Algebra Subprograms (BLAS1) July 11, 2015

7 parameter ( N2=2, N3=3, N4=4 ) integer I, J double preision A(M2,M3), E(M3,M4), S (M2,M4) double preision B(M3), P(M2), Q(M2), R(M3) double preision ZERO( 1 ) data ZERO( 1 ) / 0. 0 d0 / data (A( 1, J ), J=1,N3) / 2. 0 d0, 4.0d0, 3. 0 d0 / data (A( 2, J ), J=1,N3) / 5.0d0, 2.0d0, 6. 0 d0 / data (B( J ), J=1,N3) / 7. 0 d0, 3.0d0, 5. 0 d0 / data (E( 1, J ), J=1,N4) / 4.0d0, 2. 0 d0, 3. 0 d0, 6.0d0 / data (E( 2, J ), J=1,N4) / 7. 0 d0, 5. 0 d0, 6.0d0, 3.0d0 / data (E( 3, J ), J=1,N4) / 3. 0 d0, 4. 0 d0, 2.0d0, 5. 0 d0 / 1. p = A b using DDOT do 10 I = 1, N2 P( I ) = DDOT(N3,A( I, 1 ),M2, B, 1 ) 10 ontinue 2. q = A b using DCOPY and DAXPY a l l DCOPY(N2,ZERO, 0,Q, 1 ) do 20 J = 1, N3 a l l DAXPY(N2,B( J ),A( 1, J ), 1,Q, 1 ) 20 ontinue 3. r = (A Transposed ) p using DDOT do 30 J = 1, N3 R( J ) = DDOT(N2,A( 1, J ), 1,P, 1 ) 30 ontinue 4. S = A E using DDOT do 50 I = 1, N2 do 40 J = 1, N4 S ( I, J ) = DDOT(N3,A( I, 1 ),M2,E( 1, J ), 1 ) 40 ontinue 50 ontinue print, DRDBLAS1.. Demo d r i v e r f o r DAXPY, DCOPY, and DDOT print (/ P( ) =, 7x, 4 f 8. 1 ), (P( J ), J=1,N2) print (/ Q( ) =,7 x, 4 f 8. 1 ), (Q( J ), J=1,N2) print (/ R( ) =,7 x, 4 f 8. 1 ), (R( J ), J=1,N3) print (/ S (, ) = ) do 60 I = 1,N2 print ( Row, i2, 5 x, 4 f 8. 1 ), I, ( S ( I, J ), J=1,N4) 60 ontinue stop end July 11, 2015 Basi Linear Algebra Subprograms (BLAS1) 6.3 7

8 ODDBLAS1 DRDBLAS1.. Demo d r i v e r f o r DAXPY, DCOPY, and DDOT P( ) = Q( ) = R( ) = S (, ) = Row Row DRDBLAS2 program DRDBLAS2 >> DRDBLAS2 Krogh Minor format hange f o r C onversion. >> DRDBLAS2 Krogh Changes t o use M77CON >> DRDBLAS2 CLL >> Lawson I n i t i a l Code. Demonstrates t h e use o f BLAS s u b r o u t i n e s DROTG, DROT, DAXPY, and DCOPY to implement an a l g o r i t h m f o r s o l v i n g a l i n e a r l e a s t s q u a r e s problem using s e q u e n t i a l aumulation o f t h e data and Givens o r t h o g o n a l t r a n s f o r m a t i o n s. YTAB( ) o n t a i n s rounded v a l u e s o f X + 3 Exp( X) D r e p l a e s? : DR?BLAS2,?ROTG,?ROT,?AXPY,?COPY integer MC, MC1, MXY parameter ( MC=3, MC1=MC+1, MXY=11 ) integer IXY, J, NC, NC1, NXY double preision X, XTAB(MXY), Y, YTAB(MXY), W(MC1) double preision C, RG(MC1,MC1), S double preision COEF(MC), DIV, ESTSD, ZERO( 1 ) data XTAB / 0. 0 d0,. 1 d0,. 2 d0,. 3 d0,. 4 d0,. 5 d0,. 6 d0,. 7 d0,. 8 d0,. 9 d0, 1. 0 d0 / data YTAB / d0,. 9 1 d0,. 8 6 d0,. 8 2 d0,. 8 1 d0,. 8 2 d0,. 8 5 d0,. 8 9 d0,. 9 5 d0, d0, d0 / data NXY, NC / MXY, MC / data ZERO( 1 ) / 0. 0 d0 / NC1 = NC + 1 a l l DCOPY(MC1 MC1, ZERO, 0, RG, 1) do 20 IXY = 1, NXY X = XTAB(IXY) Y = YTAB(IXY) Build new row o f A:B in W( ). W( 1 ) = 1. 0 d0 W( 2 ) = X W( 3 ) = exp( X) W( 4 ) = Y Proess W( ) i n t o R:G Basi Linear Algebra Subprograms (BLAS1) July 11, 2015

9 do 10 J = 1, NC a l l DROTG(RG( J, J ),W( J ),C, S ) a l l DROT(NC1 J,RG( J, J+1),MC1,W( J +1),1,C, S ) 10 ontinue a l l DROTG(RG(NC1,NC1),W(NC1),C, S ) 20 ontinue Begin : S o l v e t r i a n g u l a r system. a l l DCOPY(NC,RG( 1,NC1), 1,COEF, 1 ) do 30 J = NC, 1, 1 DIV = RG( J, J ) i f (DIV. eq d0 ) then print ( ERROR:ZERO DIVISOR AT J =, I2 ), J stop end i f COEF( J ) = COEF( J ) / DIV a l l DAXPY( J 1, COEF( J ),RG( 1, J ), 1,COEF, 1 ) 30 ontinue End : S o l v e t r i a n g u l a r system. print ( S o l u t i o n : COEF( ) =,3 f 8. 3 ), (COEF( J ), J=1,NC) ESTSD = abs (RG(NC1, NC1) ) / sqrt (DBLE(NXY NC) ) print (/ Estimated Std. Dev. o f data e r r o r s =, f 9. 5 ), ESTSD stop end ODDBLAS2 S o l u t i o n : COEF( ) = Estimated Std. Dev. o f data e r r o r s = July 11, 2015 Basi Linear Algebra Subprograms (BLAS1) 6.3 9

4.3 Singular Value Decomposition and Analysis

4.3 Singular Value Decomposition and Analysis 4.3 Singular Value Deomposition and Analysis A. Purpose Any M N matrix, A, has a Singular Value Deomposition (SVD) of the form A = USV t where U is an M M orthogonal matrix, V is an N N orthogonal matrix,

More information

11.1 Polynomial Least-Squares Curve Fit

11.1 Polynomial Least-Squares Curve Fit 11.1 Polynomial Least-Squares Curve Fit A. Purpose This subroutine determines a univariate polynomial that fits a given disrete set of data in the sense of minimizing the weighted sum of squares of residuals.

More information

3.2 Gaussian (Normal) Random Numbers and Vectors

3.2 Gaussian (Normal) Random Numbers and Vectors 3.2 Gaussian (Normal) Random Numbers and Vetors A. Purpose Generate pseudorandom numbers or vetors from the Gaussian (normal) distribution. B. Usage B.1 Generating Gaussian (normal) pseudorandom numbers

More information

7.1 Roots of a Polynomial

7.1 Roots of a Polynomial 7.1 Roots of a Polynomial A. Purpose Given the oeffiients a i of a polynomial of degree n = NDEG > 0, a 1 z n + a 2 z n 1 +... + a n z + a n+1 with a 1 0, this subroutine omputes the NDEG roots of the

More information

2.9 Incomplete Elliptic Integrals

2.9 Incomplete Elliptic Integrals .9 Inomplete Ellipti Integrals A. Purpose An integral of the form R t, P t) 1/) dt 1) in whih Pt) is a polynomial of the third or fourth degree that has no multiple roots, and R is a rational funtion of

More information

Lecture 7: Sampling/Projections for Least-squares Approximation, Cont. 7 Sampling/Projections for Least-squares Approximation, Cont.

Lecture 7: Sampling/Projections for Least-squares Approximation, Cont. 7 Sampling/Projections for Least-squares Approximation, Cont. Stat60/CS94: Randomized Algorithms for Matries and Data Leture 7-09/5/013 Leture 7: Sampling/Projetions for Least-squares Approximation, Cont. Leturer: Mihael Mahoney Sribe: Mihael Mahoney Warning: these

More information

Advanced Computational Fluid Dynamics AA215A Lecture 4

Advanced Computational Fluid Dynamics AA215A Lecture 4 Advaned Computational Fluid Dynamis AA5A Leture 4 Antony Jameson Winter Quarter,, Stanford, CA Abstrat Leture 4 overs analysis of the equations of gas dynamis Contents Analysis of the equations of gas

More information

Control Theory association of mathematics and engineering

Control Theory association of mathematics and engineering Control Theory assoiation of mathematis and engineering Wojieh Mitkowski Krzysztof Oprzedkiewiz Department of Automatis AGH Univ. of Siene & Tehnology, Craow, Poland, Abstrat In this paper a methodology

More information

FINITE WORD LENGTH EFFECTS IN DSP

FINITE WORD LENGTH EFFECTS IN DSP FINITE WORD LENGTH EFFECTS IN DSP PREPARED BY GUIDED BY Snehal Gor Dr. Srianth T. ABSTRACT We now that omputers store numbers not with infinite preision but rather in some approximation that an be paed

More information

Maximum Entropy and Exponential Families

Maximum Entropy and Exponential Families Maximum Entropy and Exponential Families April 9, 209 Abstrat The goal of this note is to derive the exponential form of probability distribution from more basi onsiderations, in partiular Entropy. It

More information

Q2. [40 points] Bishop-Hill Model: Calculation of Taylor Factors for Multiple Slip

Q2. [40 points] Bishop-Hill Model: Calculation of Taylor Factors for Multiple Slip 27-750, A.D. Rollett Due: 20 th Ot., 2011. Homework 5, Volume Frations, Single and Multiple Slip Crystal Plastiity Note the 2 extra redit questions (at the end). Q1. [40 points] Single Slip: Calulating

More information

max min z i i=1 x j k s.t. j=1 x j j:i T j

max min z i i=1 x j k s.t. j=1 x j j:i T j AM 221: Advaned Optimization Spring 2016 Prof. Yaron Singer Leture 22 April 18th 1 Overview In this leture, we will study the pipage rounding tehnique whih is a deterministi rounding proedure that an be

More information

An iterative least-square method suitable for solving large sparse matrices

An iterative least-square method suitable for solving large sparse matrices An iteratie least-square method suitable for soling large sparse matries By I. M. Khabaza The purpose of this paper is to report on the results of numerial experiments with an iteratie least-square method

More information

An Integer Solution of Fractional Programming Problem

An Integer Solution of Fractional Programming Problem Gen. Math. Notes, Vol. 4, No., June 0, pp. -9 ISSN 9-784; Copyright ICSRS Publiation, 0 www.i-srs.org Available free online at http://www.geman.in An Integer Solution of Frational Programming Problem S.C.

More information

Hankel Optimal Model Order Reduction 1

Hankel Optimal Model Order Reduction 1 Massahusetts Institute of Tehnology Department of Eletrial Engineering and Computer Siene 6.245: MULTIVARIABLE CONTROL SYSTEMS by A. Megretski Hankel Optimal Model Order Redution 1 This leture overs both

More information

Model-based mixture discriminant analysis an experimental study

Model-based mixture discriminant analysis an experimental study Model-based mixture disriminant analysis an experimental study Zohar Halbe and Mayer Aladjem Department of Eletrial and Computer Engineering, Ben-Gurion University of the Negev P.O.Box 653, Beer-Sheva,

More information

(c) Calculate the tensile yield stress based on a critical resolved shear stress that we will (arbitrarily) set at 100 MPa. (c) MPa.

(c) Calculate the tensile yield stress based on a critical resolved shear stress that we will (arbitrarily) set at 100 MPa. (c) MPa. 27-750, A.D. Rollett Due: 20 th Ot., 2011. Homework 5, Volume Frations, Single and Multiple Slip Crystal Plastiity Note the 2 extra redit questions (at the end). Q1. [40 points] Single Slip: Calulating

More information

EE 321 Project Spring 2018

EE 321 Project Spring 2018 EE 21 Projet Spring 2018 This ourse projet is intended to be an individual effort projet. The student is required to omplete the work individually, without help from anyone else. (The student may, however,

More information

Math 151 Introduction to Eigenvectors

Math 151 Introduction to Eigenvectors Math 151 Introdution to Eigenvetors The motivating example we used to desrie matrixes was landsape hange and vegetation suession. We hose the simple example of Bare Soil (B), eing replaed y Grasses (G)

More information

Wuming Li and Fan Yang

Wuming Li and Fan Yang NEW ZEALAND JOURNAL OF MATHEMATICS Volume 33 (004), 159 164 N DIMENSIONAL MINKOWSKI SPACE AND SPACE TIME ALGEBRA Wuming Li and Fan Yang (Reeived February 003) Abstrat. By using an n Dimensional Minkowski

More information

KAMILLA OLIVER AND HELMUT PRODINGER

KAMILLA OLIVER AND HELMUT PRODINGER THE CONTINUED RACTION EXPANSION O GAUSS HYPERGEOMETRIC UNCTION AND A NEW APPLICATION TO THE TANGENT UNCTION KAMILLA OLIVER AND HELMUT PRODINGER Abstrat Starting from a formula for tan(nx in the elebrated

More information

Complexity of Regularization RBF Networks

Complexity of Regularization RBF Networks Complexity of Regularization RBF Networks Mark A Kon Department of Mathematis and Statistis Boston University Boston, MA 02215 mkon@buedu Leszek Plaskota Institute of Applied Mathematis University of Warsaw

More information

QUANTUM MECHANICS II PHYS 517. Solutions to Problem Set # 1

QUANTUM MECHANICS II PHYS 517. Solutions to Problem Set # 1 QUANTUM MECHANICS II PHYS 57 Solutions to Problem Set #. The hamiltonian for a lassial harmoni osillator an be written in many different forms, suh as use ω = k/m H = p m + kx H = P + Q hω a. Find a anonial

More information

The Hanging Chain. John McCuan. January 19, 2006

The Hanging Chain. John McCuan. January 19, 2006 The Hanging Chain John MCuan January 19, 2006 1 Introdution We onsider a hain of length L attahed to two points (a, u a and (b, u b in the plane. It is assumed that the hain hangs in the plane under a

More information

Optimization of Statistical Decisions for Age Replacement Problems via a New Pivotal Quantity Averaging Approach

Optimization of Statistical Decisions for Age Replacement Problems via a New Pivotal Quantity Averaging Approach Amerian Journal of heoretial and Applied tatistis 6; 5(-): -8 Published online January 7, 6 (http://www.sienepublishinggroup.om/j/ajtas) doi:.648/j.ajtas.s.65.4 IN: 36-8999 (Print); IN: 36-96 (Online)

More information

Aharonov-Bohm effect. Dan Solomon.

Aharonov-Bohm effect. Dan Solomon. Aharonov-Bohm effet. Dan Solomon. In the figure the magneti field is onfined to a solenoid of radius r 0 and is direted in the z- diretion, out of the paper. The solenoid is surrounded by a barrier that

More information

Nonreversibility of Multiple Unicast Networks

Nonreversibility of Multiple Unicast Networks Nonreversibility of Multiple Uniast Networks Randall Dougherty and Kenneth Zeger September 27, 2005 Abstrat We prove that for any finite direted ayli network, there exists a orresponding multiple uniast

More information

Where as discussed previously we interpret solutions to this partial differential equation in the weak sense: b

Where as discussed previously we interpret solutions to this partial differential equation in the weak sense: b Consider the pure initial value problem for a homogeneous system of onservation laws with no soure terms in one spae dimension: Where as disussed previously we interpret solutions to this partial differential

More information

A Characterization of Wavelet Convergence in Sobolev Spaces

A Characterization of Wavelet Convergence in Sobolev Spaces A Charaterization of Wavelet Convergene in Sobolev Spaes Mark A. Kon 1 oston University Louise Arakelian Raphael Howard University Dediated to Prof. Robert Carroll on the oasion of his 70th birthday. Abstrat

More information

A NETWORK SIMPLEX ALGORITHM FOR THE MINIMUM COST-BENEFIT NETWORK FLOW PROBLEM

A NETWORK SIMPLEX ALGORITHM FOR THE MINIMUM COST-BENEFIT NETWORK FLOW PROBLEM NETWORK SIMPLEX LGORITHM FOR THE MINIMUM COST-BENEFIT NETWORK FLOW PROBLEM Cen Çalışan, Utah Valley University, 800 W. University Parway, Orem, UT 84058, 801-863-6487, en.alisan@uvu.edu BSTRCT The minimum

More information

Differential Equations 8/24/2010

Differential Equations 8/24/2010 Differential Equations A Differential i Equation (DE) is an equation ontaining one or more derivatives of an unknown dependant d variable with respet to (wrt) one or more independent variables. Solution

More information

The Effectiveness of the Linear Hull Effect

The Effectiveness of the Linear Hull Effect The Effetiveness of the Linear Hull Effet S. Murphy Tehnial Report RHUL MA 009 9 6 Otober 009 Department of Mathematis Royal Holloway, University of London Egham, Surrey TW0 0EX, England http://www.rhul.a.uk/mathematis/tehreports

More information

Perturbation Analyses for the Cholesky Factorization with Backward Rounding Errors

Perturbation Analyses for the Cholesky Factorization with Backward Rounding Errors Perturbation Analyses for the holesky Fatorization with Bakward Rounding Errors Xiao-Wen hang Shool of omputer Siene, MGill University, Montreal, Quebe, anada, H3A A7 Abstrat. This paper gives perturbation

More information

Particle-wave symmetry in Quantum Mechanics And Special Relativity Theory

Particle-wave symmetry in Quantum Mechanics And Special Relativity Theory Partile-wave symmetry in Quantum Mehanis And Speial Relativity Theory Author one: XiaoLin Li,Chongqing,China,hidebrain@hotmail.om Corresponding author: XiaoLin Li, Chongqing,China,hidebrain@hotmail.om

More information

UTC. Engineering 329. Proportional Controller Design. Speed System. John Beverly. Green Team. John Beverly Keith Skiles John Barker.

UTC. Engineering 329. Proportional Controller Design. Speed System. John Beverly. Green Team. John Beverly Keith Skiles John Barker. UTC Engineering 329 Proportional Controller Design for Speed System By John Beverly Green Team John Beverly Keith Skiles John Barker 24 Mar 2006 Introdution This experiment is intended test the variable

More information

Time Domain Method of Moments

Time Domain Method of Moments Time Domain Method of Moments Massahusetts Institute of Tehnology 6.635 leture notes 1 Introdution The Method of Moments (MoM) introdued in the previous leture is widely used for solving integral equations

More information

Array Design for Superresolution Direction-Finding Algorithms

Array Design for Superresolution Direction-Finding Algorithms Array Design for Superresolution Diretion-Finding Algorithms Naushad Hussein Dowlut BEng, ACGI, AMIEE Athanassios Manikas PhD, DIC, AMIEE, MIEEE Department of Eletrial Eletroni Engineering Imperial College

More information

A Numerical Method For Constructing Geo-Location Isograms

A Numerical Method For Constructing Geo-Location Isograms A Numerial Method For Construting Geo-Loation Isograms Mike Grabbe The Johns Hopkins University Applied Physis Laboratory Laurel, MD Memo Number GVW--U- June 9, 2 Introdution Geo-loation is often performed

More information

Millennium Relativity Acceleration Composition. The Relativistic Relationship between Acceleration and Uniform Motion

Millennium Relativity Acceleration Composition. The Relativistic Relationship between Acceleration and Uniform Motion Millennium Relativity Aeleration Composition he Relativisti Relationship between Aeleration and niform Motion Copyright 003 Joseph A. Rybzyk Abstrat he relativisti priniples developed throughout the six

More information

TENSOR FORM OF SPECIAL RELATIVITY

TENSOR FORM OF SPECIAL RELATIVITY TENSOR FORM OF SPECIAL RELATIVITY We begin by realling that the fundamental priniple of Speial Relativity is that all physial laws must look the same to all inertial observers. This is easiest done by

More information

The Tetrahedron Quality Factors of CSDS

The Tetrahedron Quality Factors of CSDS MAX PLANCK INSTITUT FÜR AERONOMIE D 37191 Katlenburg-Lindau, Federal Republi of Germany MPAE W 100 94 27 The Tetrahedron Quality Fators of CSDS PATRICK W. DALY 1994 June 7 This report available from http://www.mpae.gwdg.de/~daly/tetra.html

More information

DIGITAL DISTANCE RELAYING SCHEME FOR PARALLEL TRANSMISSION LINES DURING INTER-CIRCUIT FAULTS

DIGITAL DISTANCE RELAYING SCHEME FOR PARALLEL TRANSMISSION LINES DURING INTER-CIRCUIT FAULTS CHAPTER 4 DIGITAL DISTANCE RELAYING SCHEME FOR PARALLEL TRANSMISSION LINES DURING INTER-CIRCUIT FAULTS 4.1 INTRODUCTION Around the world, environmental and ost onsiousness are foring utilities to install

More information

Ordered fields and the ultrafilter theorem

Ordered fields and the ultrafilter theorem F U N D A M E N T A MATHEMATICAE 59 (999) Ordered fields and the ultrafilter theorem by R. B e r r (Dortmund), F. D e l o n (Paris) and J. S h m i d (Dortmund) Abstrat. We prove that on the basis of ZF

More information

Relativistic Addition of Velocities *

Relativistic Addition of Velocities * OpenStax-CNX module: m42540 1 Relativisti Addition of Veloities * OpenStax This work is produed by OpenStax-CNX and liensed under the Creative Commons Attribution Liense 3.0 Abstrat Calulate relativisti

More information

ETSI EN V8.0.1 ( )

ETSI EN V8.0.1 ( ) EN 300 728 V8.0.1 (2000-11) European Standard (Teleommuniations series) Digital ellular teleommuniations system (Phase 2+); Comfort noise aspets for Enhaned Full Rate (EFR) speeh traffi hannels (GSM 06.62

More information

Chapter 2. Conditional Probability

Chapter 2. Conditional Probability Chapter. Conditional Probability The probabilities assigned to various events depend on what is known about the experimental situation when the assignment is made. For a partiular event A, we have used

More information

Chapter 8 Hypothesis Testing

Chapter 8 Hypothesis Testing Leture 5 for BST 63: Statistial Theory II Kui Zhang, Spring Chapter 8 Hypothesis Testing Setion 8 Introdution Definition 8 A hypothesis is a statement about a population parameter Definition 8 The two

More information

arxiv:math/ v1 [math.ca] 27 Nov 2003

arxiv:math/ v1 [math.ca] 27 Nov 2003 arxiv:math/011510v1 [math.ca] 27 Nov 200 Counting Integral Lamé Equations by Means of Dessins d Enfants Sander Dahmen November 27, 200 Abstrat We obtain an expliit formula for the number of Lamé equations

More information

arxiv:astro-ph/ v1 21 Nov 2005

arxiv:astro-ph/ v1 21 Nov 2005 Astronomy & Astrophysis manusript no. dimeq June 25, 218 (DOI: will be inserted by hand later) Dimensional Analysis applied to Spetrum Handling in Virtual Observatory Context Pedro Osuna, Jesus Salgado

More information

SURFACE WAVES OF NON-RAYLEIGH TYPE

SURFACE WAVES OF NON-RAYLEIGH TYPE SURFACE WAVES OF NON-RAYLEIGH TYPE by SERGEY V. KUZNETSOV Institute for Problems in Mehanis Prosp. Vernadskogo, 0, Mosow, 75 Russia e-mail: sv@kuznetsov.msk.ru Abstrat. Existene of surfae waves of non-rayleigh

More information

Study of EM waves in Periodic Structures (mathematical details)

Study of EM waves in Periodic Structures (mathematical details) Study of EM waves in Periodi Strutures (mathematial details) Massahusetts Institute of Tehnology 6.635 partial leture notes 1 Introdution: periodi media nomenlature 1. The spae domain is defined by a basis,(a

More information

Average Rate Speed Scaling

Average Rate Speed Scaling Average Rate Speed Saling Nikhil Bansal David P. Bunde Ho-Leung Chan Kirk Pruhs May 2, 2008 Abstrat Speed saling is a power management tehnique that involves dynamially hanging the speed of a proessor.

More information

MODELING MATTER AT NANOSCALES. 4. Introduction to quantum treatments Eigenvectors and eigenvalues of a matrix

MODELING MATTER AT NANOSCALES. 4. Introduction to quantum treatments Eigenvectors and eigenvalues of a matrix MODELING MATTER AT NANOSCALES 4 Introdution to quantum treatments 403 Eigenvetors and eigenvalues of a matrix Simultaneous equations in the variational method The problem of simultaneous equations in the

More information

F = F x x + F y. y + F z

F = F x x + F y. y + F z ECTION 6: etor Calulus MATH20411 You met vetors in the first year. etor alulus is essentially alulus on vetors. We will need to differentiate vetors and perform integrals involving vetors. In partiular,

More information

THERMAL MODELING OF PACKAGES FOR NORMAL CONDITIONS OF TRANSPORT WITH INSOLATION t

THERMAL MODELING OF PACKAGES FOR NORMAL CONDITIONS OF TRANSPORT WITH INSOLATION t THERMAL MODELING OF PACKAGES FOR NORMAL CONDITIONS OF TRANSPORT WITH INSOLATION THERMAL MODELING OF PACKAGES FOR NORMAL CONDITIONS OF TRANSPORT WITH INSOLATION t Tehnial Programs and Servies/Engineering

More information

The Laws of Acceleration

The Laws of Acceleration The Laws of Aeleration The Relationships between Time, Veloity, and Rate of Aeleration Copyright 2001 Joseph A. Rybzyk Abstrat Presented is a theory in fundamental theoretial physis that establishes the

More information

Computer Science 786S - Statistical Methods in Natural Language Processing and Data Analysis Page 1

Computer Science 786S - Statistical Methods in Natural Language Processing and Data Analysis Page 1 Computer Siene 786S - Statistial Methods in Natural Language Proessing and Data Analysis Page 1 Hypothesis Testing A statistial hypothesis is a statement about the nature of the distribution of a random

More information

A variant of Coppersmith s Algorithm with Improved Complexity and Efficient Exhaustive Search

A variant of Coppersmith s Algorithm with Improved Complexity and Efficient Exhaustive Search A variant of Coppersmith s Algorithm with Improved Complexity and Effiient Exhaustive Searh Jean-Sébastien Coron 1, Jean-Charles Faugère 2, Guénaël Renault 2, and Rina Zeitoun 2,3 1 University of Luxembourg

More information

arxiv: v2 [math.pr] 9 Dec 2016

arxiv: v2 [math.pr] 9 Dec 2016 Omnithermal Perfet Simulation for Multi-server Queues Stephen B. Connor 3th Deember 206 arxiv:60.0602v2 [math.pr] 9 De 206 Abstrat A number of perfet simulation algorithms for multi-server First Come First

More information

Sequence Analysis, WS 14/15, D. Huson & R. Neher (this part by D. Huson & J. Fischer) January 21,

Sequence Analysis, WS 14/15, D. Huson & R. Neher (this part by D. Huson & J. Fischer) January 21, Sequene Analysis, WS 14/15, D. Huson & R. Neher (this part by D. Huson & J. Fisher) January 21, 201511 9 Suffix Trees and Suffix Arrays This leture is based on the following soures, whih are all reommended

More information

A EUCLIDEAN ALTERNATIVE TO MINKOWSKI SPACETIME DIAGRAM.

A EUCLIDEAN ALTERNATIVE TO MINKOWSKI SPACETIME DIAGRAM. A EUCLIDEAN ALTERNATIVE TO MINKOWSKI SPACETIME DIAGRAM. S. Kanagaraj Eulidean Relativity s.kana.raj@gmail.om (1 August 009) Abstrat By re-interpreting the speial relativity (SR) postulates based on Eulidean

More information

REFINED UPPER BOUNDS FOR THE LINEAR DIOPHANTINE PROBLEM OF FROBENIUS. 1. Introduction

REFINED UPPER BOUNDS FOR THE LINEAR DIOPHANTINE PROBLEM OF FROBENIUS. 1. Introduction Version of 5/2/2003 To appear in Advanes in Applied Mathematis REFINED UPPER BOUNDS FOR THE LINEAR DIOPHANTINE PROBLEM OF FROBENIUS MATTHIAS BECK AND SHELEMYAHU ZACKS Abstrat We study the Frobenius problem:

More information

Wavetech, LLC. Ultrafast Pulses and GVD. John O Hara Created: Dec. 6, 2013

Wavetech, LLC. Ultrafast Pulses and GVD. John O Hara Created: Dec. 6, 2013 Ultrafast Pulses and GVD John O Hara Created: De. 6, 3 Introdution This doument overs the basi onepts of group veloity dispersion (GVD) and ultrafast pulse propagation in an optial fiber. Neessarily, it

More information

CMSC 451: Lecture 9 Greedy Approximation: Set Cover Thursday, Sep 28, 2017

CMSC 451: Lecture 9 Greedy Approximation: Set Cover Thursday, Sep 28, 2017 CMSC 451: Leture 9 Greedy Approximation: Set Cover Thursday, Sep 28, 2017 Reading: Chapt 11 of KT and Set 54 of DPV Set Cover: An important lass of optimization problems involves overing a ertain domain,

More information

Conformal Mapping among Orthogonal, Symmetric, and Skew-Symmetric Matrices

Conformal Mapping among Orthogonal, Symmetric, and Skew-Symmetric Matrices AAS 03-190 Conformal Mapping among Orthogonal, Symmetri, and Skew-Symmetri Matries Daniele Mortari Department of Aerospae Engineering, Texas A&M University, College Station, TX 77843-3141 Abstrat This

More information

Four-dimensional equation of motion for viscous compressible substance with regard to the acceleration field, pressure field and dissipation field

Four-dimensional equation of motion for viscous compressible substance with regard to the acceleration field, pressure field and dissipation field Four-dimensional equation of motion for visous ompressible substane with regard to the aeleration field, pressure field and dissipation field Sergey G. Fedosin PO box 6488, Sviazeva str. -79, Perm, Russia

More information

HOW TO FACTOR. Next you reason that if it factors, then the factorization will look something like,

HOW TO FACTOR. Next you reason that if it factors, then the factorization will look something like, HOW TO FACTOR ax bx I now want to talk a bit about how to fator ax bx where all the oeffiients a, b, and are integers. The method that most people are taught these days in high shool (assuming you go to

More information

Discrete Bessel functions and partial difference equations

Discrete Bessel functions and partial difference equations Disrete Bessel funtions and partial differene equations Antonín Slavík Charles University, Faulty of Mathematis and Physis, Sokolovská 83, 186 75 Praha 8, Czeh Republi E-mail: slavik@karlin.mff.uni.z Abstrat

More information

SOA/CAS MAY 2003 COURSE 1 EXAM SOLUTIONS

SOA/CAS MAY 2003 COURSE 1 EXAM SOLUTIONS SOA/CAS MAY 2003 COURSE 1 EXAM SOLUTIONS Prepared by S. Broverman e-mail 2brove@rogers.om website http://members.rogers.om/2brove 1. We identify the following events:. - wathed gymnastis, ) - wathed baseball,

More information

c-perfect Hashing Schemes for Binary Trees, with Applications to Parallel Memories

c-perfect Hashing Schemes for Binary Trees, with Applications to Parallel Memories -Perfet Hashing Shemes for Binary Trees, with Appliations to Parallel Memories (Extended Abstrat Gennaro Cordaso 1, Alberto Negro 1, Vittorio Sarano 1, and Arnold L.Rosenberg 2 1 Dipartimento di Informatia

More information

A note on a variational formulation of electrodynamics

A note on a variational formulation of electrodynamics Proeedings of the XV International Workshop on Geometry and Physis Puerto de la Cruz, Tenerife, Canary Islands, Spain September 11 16, 006 Publ. de la RSME, Vol. 11 (007), 314 31 A note on a variational

More information

THE TWIN PARADOX A RELATIVISTIC DOMAIN RESOLUTION

THE TWIN PARADOX A RELATIVISTIC DOMAIN RESOLUTION THE TWIN PARADOX A RELATIVISTIC DOMAIN RESOLUTION Peter G.Bass P.G.Bass www.relativitydomains.om January 0 ABSTRACT This short paper shows that the so alled "Twin Paradox" of Speial Relativity, is in fat

More information

6.4 Dividing Polynomials: Long Division and Synthetic Division

6.4 Dividing Polynomials: Long Division and Synthetic Division 6 CHAPTER 6 Rational Epressions 6. Whih of the following are equivalent to? y a., b. # y. y, y 6. Whih of the following are equivalent to 5? a a. 5, b. a 5, 5. # a a 6. In your own words, eplain one method

More information

UPPER-TRUNCATED POWER LAW DISTRIBUTIONS

UPPER-TRUNCATED POWER LAW DISTRIBUTIONS Fratals, Vol. 9, No. (00) 09 World Sientifi Publishing Company UPPER-TRUNCATED POWER LAW DISTRIBUTIONS STEPHEN M. BURROUGHS and SARAH F. TEBBENS College of Marine Siene, University of South Florida, St.

More information

Singular Event Detection

Singular Event Detection Singular Event Detetion Rafael S. Garía Eletrial Engineering University of Puerto Rio at Mayagüez Rafael.Garia@ee.uprm.edu Faulty Mentor: S. Shankar Sastry Researh Supervisor: Jonathan Sprinkle Graduate

More information

In this problem, we are given the following quantities: We want to find: Equations and basic calculations:

In this problem, we are given the following quantities: We want to find: Equations and basic calculations: .1 It takes. million tons of oal per year to a 1000-W power plant that operates at a apaity fator of 70%. If the heating value of the oal is 1,000 /lb, alulate the plant s effiieny and the heat rate. In

More information

Searching All Approximate Covers and Their Distance using Finite Automata

Searching All Approximate Covers and Their Distance using Finite Automata Searhing All Approximate Covers and Their Distane using Finite Automata Ondřej Guth, Bořivoj Melihar, and Miroslav Balík České vysoké učení tehniké v Praze, Praha, CZ, {gutho1,melihar,alikm}@fel.vut.z

More information

Explicit formulae for integrals of s and p type GTFs

Explicit formulae for integrals of s and p type GTFs ELECTRONIC JOURNAL OF THEORETICAL CHEMISTRY, VOL., 66 70 (997) Expliit formulae for integrals of s and p type GTFs CAROL A. BAXTER AND DAVID B. COOK The Department of Chemistry, The University of Sheffield,

More information

PHYSICS 104B, WINTER 2010 ASSIGNMENT FIVE SOLUTIONS N { N 2 + 1, N 2 + 2, N

PHYSICS 104B, WINTER 2010 ASSIGNMENT FIVE SOLUTIONS N { N 2 + 1, N 2 + 2, N PHYSICS 4B, WINTER 2 ASSIGNMENT FIVE SOLUTIONS [.] For uniform m =. and springs g = 2. the eigenvalues have the analyti form, The ode jaobi test yields λ k = 2g ( os k) m k = k n = 2πn N = 2π N { N 2 +,

More information

The universal model of error of active power measuring channel

The universal model of error of active power measuring channel 7 th Symposium EKO TC 4 3 rd Symposium EKO TC 9 and 5 th WADC Workshop nstrumentation for the CT Era Sept. 8-2 Kosie Slovakia The universal model of error of ative power measuring hannel Boris Stogny Evgeny

More information

Sufficient Conditions for a Flexible Manufacturing System to be Deadlocked

Sufficient Conditions for a Flexible Manufacturing System to be Deadlocked Paper 0, INT 0 Suffiient Conditions for a Flexile Manufaturing System to e Deadloked Paul E Deering, PhD Department of Engineering Tehnology and Management Ohio University deering@ohioedu Astrat In reent

More information

An Adaptive Optimization Approach to Active Cancellation of Repeated Transient Vibration Disturbances

An Adaptive Optimization Approach to Active Cancellation of Repeated Transient Vibration Disturbances An aptive Optimization Approah to Ative Canellation of Repeated Transient Vibration Disturbanes David L. Bowen RH Lyon Corp / Aenteh, 33 Moulton St., Cambridge, MA 138, U.S.A., owen@lyonorp.om J. Gregory

More information

What are the locations of excess energy in open channels?

What are the locations of excess energy in open channels? Leture 26 Energy Dissipation Strutures I. Introdution Exess energy should usually be dissipated in suh a way as to avoid erosion in unlined open hannels In this ontext, exess energy means exess water veloity

More information

On the density of languages representing finite set partitions

On the density of languages representing finite set partitions On the density of languages representing finite set partitions Nelma Moreira Rogério Reis Tehnial Report Series: DCC-04-07 Departamento de Ciênia de Computadores Fauldade de Ciênias & Laboratório de Inteligênia

More information

The gravitational phenomena without the curved spacetime

The gravitational phenomena without the curved spacetime The gravitational phenomena without the urved spaetime Mirosław J. Kubiak Abstrat: In this paper was presented a desription of the gravitational phenomena in the new medium, different than the urved spaetime,

More information

Lecture 7: z-transform Properties, Sampling and Nyquist Sampling Theorem

Lecture 7: z-transform Properties, Sampling and Nyquist Sampling Theorem EE518 Digital Signal Proessing University of Washington Autumn 21 Dept. of Eletrial Engineering ure 7: z-ransform Properties, Sampling and Nyquist Sampling heorem Ot 22, 21 Prof: J. Bilmes

More information

4.4 Solving Systems of Equations by Matrices

4.4 Solving Systems of Equations by Matrices Setion 4.4 Solving Systems of Equations by Matries 1. A first number is 8 less than a seond number. Twie the first number is 11 more than the seond number. Find the numbers.. The sum of the measures of

More information

Measuring & Inducing Neural Activity Using Extracellular Fields I: Inverse systems approach

Measuring & Inducing Neural Activity Using Extracellular Fields I: Inverse systems approach Measuring & Induing Neural Ativity Using Extraellular Fields I: Inverse systems approah Keith Dillon Department of Eletrial and Computer Engineering University of California San Diego 9500 Gilman Dr. La

More information

A Variational Definition for Limit and Derivative

A Variational Definition for Limit and Derivative Amerian Journal of Applied Mathematis 2016; 4(3): 137-141 http://www.sienepublishinggroup.om/j/ajam doi: 10.11648/j.ajam.20160403.14 ISSN: 2330-0043 (Print); ISSN: 2330-006X (Online) A Variational Definition

More information

Supplementary Materials

Supplementary Materials Supplementary Materials Neural population partitioning and a onurrent brain-mahine interfae for sequential motor funtion Maryam M. Shanehi, Rollin C. Hu, Marissa Powers, Gregory W. Wornell, Emery N. Brown

More information

High Frequency Magnetics; Black Magic, Art or Science? Magnetics Core Loss. Dr. Ray Ridley. APEC Industry Session on Magnetics

High Frequency Magnetics; Black Magic, Art or Science? Magnetics Core Loss. Dr. Ray Ridley. APEC Industry Session on Magnetics High Frequeny Magnetis; Blak Magi, Art or Siene? Magnetis Core Loss Dr. Ray Ridley APEC Industry Session on Magnetis Wednesday Marh 23 2016 www.ridleyengineering.om 1 Introdution Core loss alulations and

More information

Math 220A - Fall 2002 Homework 8 Solutions

Math 220A - Fall 2002 Homework 8 Solutions Math A - Fall Homework 8 Solutions 1. Consider u tt u = x R 3, t > u(x, ) = φ(x) u t (x, ) = ψ(x). Suppose φ, ψ are supported in the annular region a < x < b. (a) Find the time T 1 > suh that u(x, t) is

More information

Likelihood-confidence intervals for quantiles in Extreme Value Distributions

Likelihood-confidence intervals for quantiles in Extreme Value Distributions Likelihood-onfidene intervals for quantiles in Extreme Value Distributions A. Bolívar, E. Díaz-Franés, J. Ortega, and E. Vilhis. Centro de Investigaión en Matemátias; A.P. 42, Guanajuato, Gto. 36; Méxio

More information

the following action R of T on T n+1 : for each θ T, R θ : T n+1 T n+1 is defined by stated, we assume that all the curves in this paper are defined

the following action R of T on T n+1 : for each θ T, R θ : T n+1 T n+1 is defined by stated, we assume that all the curves in this paper are defined How should a snake turn on ie: A ase study of the asymptoti isoholonomi problem Jianghai Hu, Slobodan N. Simić, and Shankar Sastry Department of Eletrial Engineering and Computer Sienes University of California

More information

Lightpath routing for maximum reliability in optical mesh networks

Lightpath routing for maximum reliability in optical mesh networks Vol. 7, No. 5 / May 2008 / JOURNAL OF OPTICAL NETWORKING 449 Lightpath routing for maximum reliability in optial mesh networks Shengli Yuan, 1, * Saket Varma, 2 and Jason P. Jue 2 1 Department of Computer

More information

8.2 Solve System of Nonlinear Equations

8.2 Solve System of Nonlinear Equations 8.2 Solve System of Nonlinear Equations A. Purpose This subroutine solves a system of n nonlinear equations in n unknowns. The problem can be expressed as f(x) = 0 where x denotes an n-vector of unknowns

More information

EN V4.0.1 ( )

EN V4.0.1 ( ) European Standard (Teleommuniations series) Digital ellular teleommuniations system (Phase 2); Substitution and muting of lost frames for Enhaned Full Rate (EFR) speeh traffi hannels () GLOBAL SYSTEM FOR

More information

A Unified View on Multi-class Support Vector Classification Supplement

A Unified View on Multi-class Support Vector Classification Supplement Journal of Mahine Learning Researh??) Submitted 7/15; Published?/?? A Unified View on Multi-lass Support Vetor Classifiation Supplement Ürün Doğan Mirosoft Researh Tobias Glasmahers Institut für Neuroinformatik

More information

Scalable Positivity Preserving Model Reduction Using Linear Energy Functions

Scalable Positivity Preserving Model Reduction Using Linear Energy Functions Salable Positivity Preserving Model Redution Using Linear Energy Funtions Sootla, Aivar; Rantzer, Anders Published in: IEEE 51st Annual Conferene on Deision and Control (CDC), 2012 DOI: 10.1109/CDC.2012.6427032

More information

1 sin 2 r = 1 n 2 sin 2 i

1 sin 2 r = 1 n 2 sin 2 i Physis 505 Fall 005 Homework Assignment #11 Solutions Textbook problems: Ch. 7: 7.3, 7.5, 7.8, 7.16 7.3 Two plane semi-infinite slabs of the same uniform, isotropi, nonpermeable, lossless dieletri with

More information