{-# LANGUAGE CPP #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE ExistentialQuantification #-}
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE FlexibleInstances #-}
module Codec.Picture.Metadata(
Metadatas
, Keys( .. )
, Value( .. )
, Elem( .. )
, SourceFormat( .. )
, Codec.Picture.Metadata.lookup
, empty
, insert
, delete
, singleton
, foldl'
, Codec.Picture.Metadata.foldMap
, mkDpiMetadata
, mkSizeMetadata
, basicMetadata
, simpleMetadata
, extractExifMetas
, dotsPerMeterToDotPerInch
, dotPerInchToDotsPerMeter
, dotsPerCentiMeterToDotPerInch
) where
#if !MIN_VERSION_base(4,8,0)
import Data.Monoid( Monoid, mempty, mappend )
import Data.Word( Word )
#endif
import Control.DeepSeq( NFData( .. ) )
import qualified Data.Foldable as F
import Codec.Picture.Metadata.Exif
#if MIN_VERSION_base(4,7,0)
import Data.Typeable( (:~:)( Refl ) )
type Equiv = (:~:)
#else
data Equiv a b where
Refl :: Equiv a a
#endif
data SourceFormat
= SourceJpeg
| SourceGif
| SourceBitmap
| SourceTiff
| SourcePng
| SourceHDR
| SourceTGA
deriving (Eq, Show)
instance NFData SourceFormat where
rnf a = a `seq` ()
data Keys a where
Gamma :: Keys Double
Format :: Keys SourceFormat
DpiX :: Keys Word
DpiY :: Keys Word
Width :: Keys Word
Height :: Keys Word
Title :: Keys String
Description :: Keys String
Author :: Keys String
Copyright :: Keys String
Software :: Keys String
Comment :: Keys String
Disclaimer :: Keys String
Source :: Keys String
Warning :: Keys String
Exif :: !ExifTag -> Keys ExifData
Unknown :: !String -> Keys Value
deriving instance Show (Keys a)
deriving instance Eq (Keys a)
data Value
= Int !Int
| Double !Double
| String !String
deriving (Eq, Show)
instance NFData Value where
rnf v = v `seq` ()
data Elem k =
forall a. (Show a, NFData a) => !(k a) :=> a
deriving instance Show (Elem Keys)
instance NFData (Elem Keys) where
rnf (_ :=> v) = rnf v `seq` ()
keyEq :: Keys a -> Keys b -> Maybe (Equiv a b)
keyEq a b = case (a, b) of
(Gamma, Gamma) -> Just Refl
(DpiX, DpiX) -> Just Refl
(DpiY, DpiY) -> Just Refl
(Width, Width) -> Just Refl
(Height, Height) -> Just Refl
(Title, Title) -> Just Refl
(Description, Description) -> Just Refl
(Author, Author) -> Just Refl
(Copyright, Copyright) -> Just Refl
(Software, Software) -> Just Refl
(Comment, Comment) -> Just Refl
(Disclaimer, Disclaimer) -> Just Refl
(Source, Source) -> Just Refl
(Warning, Warning) -> Just Refl
(Format, Format) -> Just Refl
(Unknown v1, Unknown v2) | v1 == v2 -> Just Refl
(Exif t1, Exif t2) | t1 == t2 -> Just Refl
_ -> Nothing
newtype Metadatas = Metadatas
{ getMetadatas :: [Elem Keys]
}
deriving (Show, NFData)
instance Monoid Metadatas where
mempty = empty
#if !MIN_VERSION_base(4,11,0)
mappend = union
#else
instance Semigroup Metadatas where
(<>) = union
#endif
union :: Metadatas -> Metadatas -> Metadatas
union m1 = F.foldl' go m1 . getMetadatas where
go acc el@(k :=> _) = Metadatas $ el : getMetadatas (delete k acc)
foldl' :: (acc -> Elem Keys -> acc) -> acc -> Metadatas -> acc
foldl' f initAcc = F.foldl' f initAcc . getMetadatas
foldMap :: Monoid m => (Elem Keys -> m) -> Metadatas -> m
foldMap f = foldl' (\acc v -> acc `mappend` f v) mempty
delete :: Keys a -> Metadatas -> Metadatas
delete k = Metadatas . go . getMetadatas where
go [] = []
go (el@(k2 :=> _) : rest) = case keyEq k k2 of
Nothing -> el : go rest
Just Refl -> rest
extractExifMetas :: Metadatas -> [(ExifTag, ExifData)]
extractExifMetas = go . getMetadatas where
go :: [Elem Keys] -> [(ExifTag, ExifData)]
go [] = []
go ((k :=> v) : rest) =
case k of
Exif t -> (t, v) : go rest
_ -> go rest
lookup :: Keys a -> Metadatas -> Maybe a
lookup k = go . getMetadatas where
go [] = Nothing
go ((k2 :=> v) : rest) = case keyEq k k2 of
Nothing -> go rest
Just Refl -> Just v
insert :: (Show a, NFData a) => Keys a -> a -> Metadatas -> Metadatas
insert k val metas =
Metadatas $ (k :=> val) : getMetadatas (delete k metas)
singleton :: (Show a, NFData a) => Keys a -> a -> Metadatas
singleton k val = Metadatas [k :=> val]
empty :: Metadatas
empty = Metadatas mempty
dotsPerMeterToDotPerInch :: Word -> Word
dotsPerMeterToDotPerInch z = z * 254 `div` 10000
dotPerInchToDotsPerMeter :: Word -> Word
dotPerInchToDotsPerMeter z = (z * 10000) `div` 254
dotsPerCentiMeterToDotPerInch :: Word -> Word
dotsPerCentiMeterToDotPerInch z = z * 254 `div` 100
mkDpiMetadata :: Word -> Metadatas
mkDpiMetadata w =
Metadatas [DpiY :=> w, DpiX :=> w]
mkSizeMetadata :: Integral n => n -> n -> Metadatas
mkSizeMetadata w h =
Metadatas [ Width :=> fromIntegral w, Height :=> fromIntegral h ]
basicMetadata :: Integral nSize => SourceFormat -> nSize -> nSize -> Metadatas
basicMetadata f w h =
Metadatas [ Format :=> f
, Width :=> fromIntegral w
, Height :=> fromIntegral h
]
simpleMetadata :: (Integral nSize, Integral nDpi)
=> SourceFormat -> nSize -> nSize -> nDpi -> nDpi -> Metadatas
simpleMetadata f w h dpiX dpiY =
Metadatas [ Format :=> f
, Width :=> fromIntegral w
, Height :=> fromIntegral h
, DpiX :=> fromIntegral dpiX
, DpiY :=> fromIntegral dpiY
]