friday-0.2.3.1: A functional image processing library for Haskell.
Vision.Image.Grey.Type
type Grey = Manifest GreyPixel Source #
newtype GreyPixel Source #
Constructors
Instances
Methods
minBound :: GreyPixel #
maxBound :: GreyPixel #
succ :: GreyPixel -> GreyPixel #
pred :: GreyPixel -> GreyPixel #
toEnum :: Int -> GreyPixel #
fromEnum :: GreyPixel -> Int #
enumFrom :: GreyPixel -> [GreyPixel] #
enumFromThen :: GreyPixel -> GreyPixel -> [GreyPixel] #
enumFromTo :: GreyPixel -> GreyPixel -> [GreyPixel] #
enumFromThenTo :: GreyPixel -> GreyPixel -> GreyPixel -> [GreyPixel] #
(==) :: GreyPixel -> GreyPixel -> Bool #
(/=) :: GreyPixel -> GreyPixel -> Bool #
quot :: GreyPixel -> GreyPixel -> GreyPixel #
rem :: GreyPixel -> GreyPixel -> GreyPixel #
div :: GreyPixel -> GreyPixel -> GreyPixel #
mod :: GreyPixel -> GreyPixel -> GreyPixel #
quotRem :: GreyPixel -> GreyPixel -> (GreyPixel, GreyPixel) #
divMod :: GreyPixel -> GreyPixel -> (GreyPixel, GreyPixel) #
toInteger :: GreyPixel -> Integer #
(+) :: GreyPixel -> GreyPixel -> GreyPixel #
(-) :: GreyPixel -> GreyPixel -> GreyPixel #
(*) :: GreyPixel -> GreyPixel -> GreyPixel #
negate :: GreyPixel -> GreyPixel #
abs :: GreyPixel -> GreyPixel #
signum :: GreyPixel -> GreyPixel #
fromInteger :: Integer -> GreyPixel #
compare :: GreyPixel -> GreyPixel -> Ordering #
(<) :: GreyPixel -> GreyPixel -> Bool #
(<=) :: GreyPixel -> GreyPixel -> Bool #
(>) :: GreyPixel -> GreyPixel -> Bool #
(>=) :: GreyPixel -> GreyPixel -> Bool #
max :: GreyPixel -> GreyPixel -> GreyPixel #
min :: GreyPixel -> GreyPixel -> GreyPixel #
readsPrec :: Int -> ReadS GreyPixel #
readList :: ReadS [GreyPixel] #
readPrec :: ReadPrec GreyPixel #
readListPrec :: ReadPrec [GreyPixel] #
toRational :: GreyPixel -> Rational #
showsPrec :: Int -> GreyPixel -> ShowS #
show :: GreyPixel -> String #
showList :: [GreyPixel] -> ShowS #
sizeOf :: GreyPixel -> Int #
alignment :: GreyPixel -> Int #
peekElemOff :: Ptr GreyPixel -> Int -> IO GreyPixel #
pokeElemOff :: Ptr GreyPixel -> Int -> GreyPixel -> IO () #
peekByteOff :: Ptr b -> Int -> IO GreyPixel #
pokeByteOff :: Ptr b -> Int -> GreyPixel -> IO () #
peek :: Ptr GreyPixel -> IO GreyPixel #
poke :: Ptr GreyPixel -> GreyPixel -> IO () #
(.&.) :: GreyPixel -> GreyPixel -> GreyPixel #
(.|.) :: GreyPixel -> GreyPixel -> GreyPixel #
xor :: GreyPixel -> GreyPixel -> GreyPixel #
complement :: GreyPixel -> GreyPixel #
shift :: GreyPixel -> Int -> GreyPixel #
rotate :: GreyPixel -> Int -> GreyPixel #
zeroBits :: GreyPixel #
bit :: Int -> GreyPixel #
setBit :: GreyPixel -> Int -> GreyPixel #
clearBit :: GreyPixel -> Int -> GreyPixel #
complementBit :: GreyPixel -> Int -> GreyPixel #
testBit :: GreyPixel -> Int -> Bool #
bitSizeMaybe :: GreyPixel -> Maybe Int #
bitSize :: GreyPixel -> Int #
isSigned :: GreyPixel -> Bool #
shiftL :: GreyPixel -> Int -> GreyPixel #
unsafeShiftL :: GreyPixel -> Int -> GreyPixel #
shiftR :: GreyPixel -> Int -> GreyPixel #
unsafeShiftR :: GreyPixel -> Int -> GreyPixel #
rotateL :: GreyPixel -> Int -> GreyPixel #
rotateR :: GreyPixel -> Int -> GreyPixel #
popCount :: GreyPixel -> Int #
Associated Types
type PixelChannel GreyPixel :: * Source #
pixNChannels :: GreyPixel -> Int Source #
pixIndex :: GreyPixel -> Int -> PixelChannel GreyPixel Source #
interpol :: (PixelChannel GreyPixel -> PixelChannel GreyPixel -> PixelChannel GreyPixel) -> GreyPixel -> GreyPixel -> GreyPixel Source #
type PixelValueSpace GreyPixel :: * Source #
pixToIndex :: GreyPixel -> PixelValueSpace GreyPixel Source #
domainSize :: GreyPixel -> PixelValueSpace GreyPixel Source #
type GreyDelayed = Delayed GreyPixel Source #