{-# LANGUAGE TypeFamilies #-}
module Numeric.LAPACK.Matrix.Special (
   Type.Matrix(Scale,Inverse), Scale, Inverse,
   ) where

import qualified Numeric.LAPACK.Matrix.Type as Type


type Scale sh = Type.Matrix (Type.Scale sh)
type Inverse typ = Type.Matrix (Type.Inverse typ)