sized-types-0.3.5.2: Sized types in Haskell.

Safe HaskellSafe
LanguageHaskell98

Data.Sized.Sampled

Documentation

data Sampled m n Source #

Constructors

Sampled (Signed n) Rational 

Instances

(Size ix, Size m) => Enum (Sampled m ix) Source # 

Methods

succ :: Sampled m ix -> Sampled m ix #

pred :: Sampled m ix -> Sampled m ix #

toEnum :: Int -> Sampled m ix #

fromEnum :: Sampled m ix -> Int #

enumFrom :: Sampled m ix -> [Sampled m ix] #

enumFromThen :: Sampled m ix -> Sampled m ix -> [Sampled m ix] #

enumFromTo :: Sampled m ix -> Sampled m ix -> [Sampled m ix] #

enumFromThenTo :: Sampled m ix -> Sampled m ix -> Sampled m ix -> [Sampled m ix] #

Size ix => Eq (Sampled m ix) Source # 

Methods

(==) :: Sampled m ix -> Sampled m ix -> Bool #

(/=) :: Sampled m ix -> Sampled m ix -> Bool #

(Size ix, Size m) => Fractional (Sampled m ix) Source # 

Methods

(/) :: Sampled m ix -> Sampled m ix -> Sampled m ix #

recip :: Sampled m ix -> Sampled m ix #

fromRational :: Rational -> Sampled m ix #

(Size ix, Size m) => Num (Sampled m ix) Source # 

Methods

(+) :: Sampled m ix -> Sampled m ix -> Sampled m ix #

(-) :: Sampled m ix -> Sampled m ix -> Sampled m ix #

(*) :: Sampled m ix -> Sampled m ix -> Sampled m ix #

negate :: Sampled m ix -> Sampled m ix #

abs :: Sampled m ix -> Sampled m ix #

signum :: Sampled m ix -> Sampled m ix #

fromInteger :: Integer -> Sampled m ix #

Size ix => Ord (Sampled m ix) Source # 

Methods

compare :: Sampled m ix -> Sampled m ix -> Ordering #

(<) :: Sampled m ix -> Sampled m ix -> Bool #

(<=) :: Sampled m ix -> Sampled m ix -> Bool #

(>) :: Sampled m ix -> Sampled m ix -> Bool #

(>=) :: Sampled m ix -> Sampled m ix -> Bool #

max :: Sampled m ix -> Sampled m ix -> Sampled m ix #

min :: Sampled m ix -> Sampled m ix -> Sampled m ix #

(Size ix, Size m) => Read (Sampled m ix) Source # 
(Size ix, Size m) => Real (Sampled m ix) Source # 

Methods

toRational :: Sampled m ix -> Rational #

Size ix => Show (Sampled m ix) Source # 

Methods

showsPrec :: Int -> Sampled m ix -> ShowS #

show :: Sampled m ix -> String #

showList :: [Sampled m ix] -> ShowS #

fromMatrix :: forall n m. (Size n, Size m) => Matrix n Bool -> Sampled m n Source #

mkSampled :: forall n m. (Size n, Size m) => Rational -> Sampled m n Source #