{-# OPTIONS_HADDOCK hide #-}
module Codec.BMP.Base
        ( BMP   (..))
where
import Codec.BMP.FileHeader
import Codec.BMP.BitmapInfo
import Data.ByteString


-- | A BMP image.
--      For an uncompressed image, the image data contains triples of BGR
--      component values. Each line may also have zero pad values on the end,
--      to bring them up to a multiple of 4 bytes in length.
data BMP
        = BMP
        { BMP -> FileHeader
bmpFileHeader         :: FileHeader
        , BMP -> BitmapInfo
bmpBitmapInfo         :: BitmapInfo
        , BMP -> ByteString
bmpRawImageData       :: ByteString }
        deriving Int -> BMP -> ShowS
[BMP] -> ShowS
BMP -> String
(Int -> BMP -> ShowS)
-> (BMP -> String) -> ([BMP] -> ShowS) -> Show BMP
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> BMP -> ShowS
showsPrec :: Int -> BMP -> ShowS
$cshow :: BMP -> String
show :: BMP -> String
$cshowList :: [BMP] -> ShowS
showList :: [BMP] -> ShowS
Show