{-# LANGUAGE MultiParamTypeClasses #-} ----------------------------------------------------------------------------- -- | -- Module : BLAS.Matrix.Solve.Immutable -- Copyright : Copyright (c) , Patrick Perry -- License : BSD3 -- Maintainer : Patrick Perry -- Stability : experimental -- module BLAS.Matrix.Solve.Immutable ( ISolve(..) ) where import BLAS.Matrix.Immutable import Data.Vector.Dense ( Vector ) import Data.Matrix.Dense ( Matrix ) infixl 7 <\>, <\\> class IMatrix a e => ISolve a e where -- | Solve for a vector (<\>) :: a (m,n) e -> Vector m e -> Vector n e -- | Solve for a matrix (<\\>) :: a (m,n) e -> Matrix (m,k) e -> Matrix (n,k) e