{- | Data types for working with the metadata of epub documents

   This contains the guide section in an epub2 OPF document. It has been deprecated in the epub3 spec and should not be present in epub3 documents.
-}
module Codec.Epub.Data.Guide
   ( GuideRef (..)
   )
   where

import Codec.Epub.Data.Common


-- | package\/guide\/reference tag
data GuideRef = GuideRef
   { GuideRef -> String
grType :: String  -- ^ type attribute. Must follow 13th edition of the Chicago Manual of Style
   , GuideRef -> Maybe String
grTitle :: Maybe String  -- ^ title attribute
   , GuideRef -> String
grHref :: MFItemId  -- ^ href attribute. Must reference an item in the manifest
   }
   deriving (GuideRef -> GuideRef -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GuideRef -> GuideRef -> Bool
$c/= :: GuideRef -> GuideRef -> Bool
== :: GuideRef -> GuideRef -> Bool
$c== :: GuideRef -> GuideRef -> Bool
Eq, Int -> GuideRef -> ShowS
[GuideRef] -> ShowS
GuideRef -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GuideRef] -> ShowS
$cshowList :: [GuideRef] -> ShowS
show :: GuideRef -> String
$cshow :: GuideRef -> String
showsPrec :: Int -> GuideRef -> ShowS
$cshowsPrec :: Int -> GuideRef -> ShowS
Show)