|
| Data.Matrix.Banded.IO | | Stability | experimental | | Maintainer | Patrick Perry <patperry@stanford.edu> |
|
|
|
|
|
| Description |
|
|
| Synopsis |
|
| data BMatrix t mn e = BM {} | | | type IOBanded = BMatrix Mut | | | module BLAS.Matrix.Base | | | module BLAS.Tensor.Base | | | module BLAS.Tensor.Dense.ReadOnly | | | module BLAS.Tensor.ReadOnly | | | module BLAS.Tensor.Mutable | | | newBanded :: BLAS1 e => (Int, Int) -> (Int, Int) -> [((Int, Int), e)] -> IO (BMatrix t (m, n) e) | | | newBanded_ :: Elem e => (Int, Int) -> (Int, Int) -> IO (BMatrix t (m, n) e) | | | newListsBanded :: BLAS1 e => (Int, Int) -> (Int, Int) -> [[e]] -> IO (BMatrix t (m, n) e) | | | rowView :: Elem e => BMatrix t (m, n) e -> Int -> (Int, DVector t k e, Int) | | | colView :: Elem e => BMatrix t (m, n) e -> Int -> (Int, DVector t k e, Int) | | | getRow :: BLAS1 e => BMatrix t (m, n) e -> Int -> IO (DVector r n e) | | | getCol :: BLAS1 e => BMatrix t (m, n) e -> Int -> IO (DVector r m e) | | | diag :: Elem e => BMatrix t (m, n) e -> Int -> DVector t k e | | | module Data.Matrix.Banded.Operations | | | toForeignPtr :: BMatrix t (m, n) e -> (ForeignPtr e, Int, (Int, Int), (Int, Int), Int, Bool) | | | fromForeignPtr :: ForeignPtr e -> Int -> (Int, Int) -> (Int, Int) -> Int -> Bool -> BMatrix t (m, n) e | | | bandwidth :: BMatrix t (m, n) e -> (Int, Int) | | | numLower :: BMatrix t (m, n) e -> Int | | | numUpper :: BMatrix t (m, n) e -> Int | | | coerceBanded :: BMatrix t mn e -> BMatrix t kl e | | | unsafeNewBanded :: BLAS1 e => (Int, Int) -> (Int, Int) -> [((Int, Int), e)] -> IO (BMatrix t (m, n) e) | | | unsafeWithElemPtr :: Elem e => BMatrix t (m, n) e -> (Int, Int) -> (Ptr e -> IO a) -> IO a | | | unsafeRowView :: Elem e => BMatrix t (m, n) e -> Int -> (Int, DVector t k e, Int) | | | unsafeColView :: Elem e => BMatrix t (m, n) e -> Int -> (Int, DVector t k e, Int) | | | unsafeGetRow :: BLAS1 e => BMatrix t (m, n) e -> Int -> IO (DVector r n e) | | | unsafeGetCol :: BLAS1 e => BMatrix t (m, n) e -> Int -> IO (DVector r m e) | | | unsafeDiag :: Elem e => BMatrix t (m, n) e -> Int -> DVector t k e | | | unsafeFreeze :: BMatrix t mn e -> Banded mn e | | | unsafeThaw :: BMatrix t mn e -> IOBanded mn e |
|
|
|
| The mutable banded matrix data type
|
|
|
| Constructors | | Instances | | Matrix (BMatrix t) | | BLAS2 e => RMatrix (BMatrix s) e | | BLAS2 e => IMatrix (BMatrix Imm) e | | BLAS1 e => Scalable (BMatrix Imm ((,) m n)) e | | BLAS1 e => ITensor (BMatrix Imm ((,) m n)) ((,) Int Int) e | | BLAS1 e => RTensor (BMatrix t ((,) m n)) ((,) Int Int) e IO | | BLAS1 e => MTensor (BMatrix Mut ((,) m n)) ((,) Int Int) e IO | | (BLAS1 e, Eq e) => Eq (BMatrix Imm ((,) m n) e) | | BLAS1 e => Show (BMatrix Imm ((,) m n) e) | | (BLAS1 e, AEq e) => AEq (BMatrix Imm ((,) m n) e) |
|
|
|
|
|
| module BLAS.Matrix.Base |
|
| module BLAS.Tensor.Base |
|
| module BLAS.Tensor.Dense.ReadOnly |
|
| module BLAS.Tensor.ReadOnly |
|
| module BLAS.Tensor.Mutable |
|
| Creating new matrices
|
|
|
|
|
|
|
|
| Views
|
|
| Rows and columns
|
|
|
|
|
|
|
|
|
|
| Diagonals
|
|
|
|
| Operations
|
|
| module Data.Matrix.Banded.Operations |
|
| Converting to and from banded matrices
|
|
| ForeignPtrs
|
|
|
|
|
|
| Bandwith properties
|
|
|
|
|
|
|
|
| Coercing
|
|
|
| Coerce the phantom shape type from one type to another.
|
|
| Unsafe operations
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
| Produced by Haddock version 2.3.0 |