generic-pretty-instances-0.1.0.0: GenericPretty canonical instances
Safe HaskellSafe-Inferred
LanguageHaskell2010

Text.PrettyPrint.GenericPretty.Instance

Orphan instances

Out ThreadId Source # 
Instance details

Methods

docPrec :: Int -> ThreadId -> Doc #

doc :: ThreadId -> Doc #

docList :: [ThreadId] -> Doc #

Out BlockedIndefinitelyOnMVar Source # 
Instance details

Out Int32 Source # 
Instance details

Methods

docPrec :: Int -> Int32 -> Doc #

doc :: Int32 -> Doc #

docList :: [Int32] -> Doc #

Out Int64 Source # 
Instance details

Methods

docPrec :: Int -> Int64 -> Doc #

doc :: Int64 -> Doc #

docList :: [Int64] -> Doc #

Out Word32 Source # 
Instance details

Methods

docPrec :: Int -> Word32 -> Doc #

doc :: Word32 -> Doc #

docList :: [Word32] -> Doc #

Out Word64 Source # 
Instance details

Methods

docPrec :: Int -> Word64 -> Doc #

doc :: Word64 -> Doc #

docList :: [Word64] -> Doc #

Out ByteString Source # 
Instance details

Out LiteralType Source # 
Instance details

Out PersistValue Source # 
Instance details

Out Tag Source # 
Instance details

Methods

docPrec :: Int -> Tag -> Doc #

doc :: Tag -> Doc #

docList :: [Tag] -> Doc #

Out TaggedValue Source # 
Instance details

Methods

docPrec :: Int -> TaggedValue -> Doc #

doc :: TaggedValue -> Doc #

docList :: [TaggedValue] -> Doc #

Out WireValue Source # 
Instance details

Methods

docPrec :: Int -> WireValue -> Doc #

doc :: WireValue -> Doc #

docList :: [WireValue] -> Doc #

Out PubKey Source # 
Instance details

Methods

docPrec :: Int -> PubKey -> Doc #

doc :: PubKey -> Doc #

docList :: [PubKey] -> Doc #

Out Sig Source # 
Instance details

Methods

docPrec :: Int -> Sig -> Doc #

doc :: Sig -> Doc #

docList :: [Sig] -> Doc #

Out Text Source # 
Instance details

Methods

docPrec :: Int -> Text -> Doc #

doc :: Text -> Doc #

docList :: [Text] -> Doc #

Out Text Source # 
Instance details

Methods

docPrec :: Int -> Text -> Doc #

doc :: Text -> Doc #

docList :: [Text] -> Doc #

Out Day Source # 
Instance details

Methods

docPrec :: Int -> Day -> Doc #

doc :: Day -> Doc #

docList :: [Day] -> Doc #

Out DiffTime Source # 
Instance details

Methods

docPrec :: Int -> DiffTime -> Doc #

doc :: DiffTime -> Doc #

docList :: [DiffTime] -> Doc #

Out UTCTime Source # 
Instance details

Methods

docPrec :: Int -> UTCTime -> Doc #

doc :: UTCTime -> Doc #

docList :: [UTCTime] -> Doc #

Out TimeOfDay Source # 
Instance details

Methods

docPrec :: Int -> TimeOfDay -> Doc #

doc :: TimeOfDay -> Doc #

docList :: [TimeOfDay] -> Doc #

Generic BlockedIndefinitelyOnMVar Source # 
Instance details

Associated Types

type Rep BlockedIndefinitelyOnMVar :: Type -> Type #

Generic LiteralType Source # 
Instance details

Associated Types

type Rep LiteralType :: Type -> Type #

Generic PersistValue Source # 
Instance details

Associated Types

type Rep PersistValue :: Type -> Type #

Generic Tag Source # 
Instance details

Associated Types

type Rep Tag :: Type -> Type #

Methods

from :: Tag -> Rep Tag x #

to :: Rep Tag x -> Tag #

Generic TaggedValue Source # 
Instance details

Associated Types

type Rep TaggedValue :: Type -> Type #

Methods

from :: TaggedValue -> Rep TaggedValue x #

to :: Rep TaggedValue x -> TaggedValue #

Generic WireValue Source # 
Instance details

Associated Types

type Rep WireValue :: Type -> Type #

Methods

from :: WireValue -> Rep WireValue x #

to :: Rep WireValue x -> WireValue #

Generic Day Source # 
Instance details

Associated Types

type Rep Day :: Type -> Type #

Methods

from :: Day -> Rep Day x #

to :: Rep Day x -> Day #

Generic UTCTime Source # 
Instance details

Associated Types

type Rep UTCTime :: Type -> Type #

Methods

from :: UTCTime -> Rep UTCTime x #

to :: Rep UTCTime x -> UTCTime #

Generic TimeOfDay Source # 
Instance details

Associated Types

type Rep TimeOfDay :: Type -> Type #

Out a => Out (CI a) Source # 
Instance details

Methods

docPrec :: Int -> CI a -> Doc #

doc :: CI a -> Doc #

docList :: [CI a] -> Doc #

(Generic a, Generic (Key a), Out a, Out (Key a)) => Out (Entity a) Source # 
Instance details

Methods

docPrec :: Int -> Entity a -> Doc #

doc :: Entity a -> Doc #

docList :: [Entity a] -> Doc #

Out a => Out (Vector a) Source # 
Instance details

Methods

docPrec :: Int -> Vector a -> Doc #

doc :: Vector a -> Doc #

docList :: [Vector a] -> Doc #

(Out a, Unbox a) => Out (Vector a) Source # 
Instance details

Methods

docPrec :: Int -> Vector a -> Doc #

doc :: Vector a -> Doc #

docList :: [Vector a] -> Doc #

Out (Fixed a) Source # 
Instance details

Methods

docPrec :: Int -> Fixed a -> Doc #

doc :: Fixed a -> Doc #

docList :: [Fixed a] -> Doc #

(Out a, Out b) => Out (Map a b) Source # 
Instance details

Methods

docPrec :: Int -> Map a b -> Doc #

doc :: Map a b -> Doc #

docList :: [Map a b] -> Doc #

Generic (Fixed a) Source # 
Instance details

Associated Types

type Rep (Fixed a) :: Type -> Type #

Methods

from :: Fixed a -> Rep (Fixed a) x #

to :: Rep (Fixed a) x -> Fixed a #