Text.PrettyPrint.GenericPretty.Instance
Contents
Methods
docPrec :: Int -> ThreadId -> Doc #
doc :: ThreadId -> Doc #
docList :: [ThreadId] -> Doc #
docPrec :: Int -> BlockedIndefinitelyOnMVar -> Doc #
doc :: BlockedIndefinitelyOnMVar -> Doc #
docList :: [BlockedIndefinitelyOnMVar] -> Doc #
docPrec :: Int -> Int32 -> Doc #
doc :: Int32 -> Doc #
docList :: [Int32] -> Doc #
docPrec :: Int -> Int64 -> Doc #
doc :: Int64 -> Doc #
docList :: [Int64] -> Doc #
docPrec :: Int -> Word32 -> Doc #
doc :: Word32 -> Doc #
docList :: [Word32] -> Doc #
docPrec :: Int -> Word64 -> Doc #
doc :: Word64 -> Doc #
docList :: [Word64] -> Doc #
docPrec :: Int -> ByteString -> Doc #
doc :: ByteString -> Doc #
docList :: [ByteString] -> Doc #
docPrec :: Int -> LiteralType -> Doc #
doc :: LiteralType -> Doc #
docList :: [LiteralType] -> Doc #
docPrec :: Int -> PersistValue -> Doc #
doc :: PersistValue -> Doc #
docList :: [PersistValue] -> Doc #
docPrec :: Int -> Tag -> Doc #
doc :: Tag -> Doc #
docList :: [Tag] -> Doc #
docPrec :: Int -> TaggedValue -> Doc #
doc :: TaggedValue -> Doc #
docList :: [TaggedValue] -> Doc #
docPrec :: Int -> WireValue -> Doc #
doc :: WireValue -> Doc #
docList :: [WireValue] -> Doc #
docPrec :: Int -> PubKey -> Doc #
doc :: PubKey -> Doc #
docList :: [PubKey] -> Doc #
docPrec :: Int -> Sig -> Doc #
doc :: Sig -> Doc #
docList :: [Sig] -> Doc #
docPrec :: Int -> Text -> Doc #
doc :: Text -> Doc #
docList :: [Text] -> Doc #
docPrec :: Int -> Day -> Doc #
doc :: Day -> Doc #
docList :: [Day] -> Doc #
docPrec :: Int -> DiffTime -> Doc #
doc :: DiffTime -> Doc #
docList :: [DiffTime] -> Doc #
docPrec :: Int -> UTCTime -> Doc #
doc :: UTCTime -> Doc #
docList :: [UTCTime] -> Doc #
docPrec :: Int -> TimeOfDay -> Doc #
doc :: TimeOfDay -> Doc #
docList :: [TimeOfDay] -> Doc #
Associated Types
type Rep BlockedIndefinitelyOnMVar :: Type -> Type #
from :: BlockedIndefinitelyOnMVar -> Rep BlockedIndefinitelyOnMVar x #
to :: Rep BlockedIndefinitelyOnMVar x -> BlockedIndefinitelyOnMVar #
type Rep LiteralType :: Type -> Type #
from :: LiteralType -> Rep LiteralType x #
to :: Rep LiteralType x -> LiteralType #
type Rep PersistValue :: Type -> Type #
from :: PersistValue -> Rep PersistValue x #
to :: Rep PersistValue x -> PersistValue #
type Rep Tag :: Type -> Type #
from :: Tag -> Rep Tag x #
to :: Rep Tag x -> Tag #
type Rep TaggedValue :: Type -> Type #
from :: TaggedValue -> Rep TaggedValue x #
to :: Rep TaggedValue x -> TaggedValue #
type Rep WireValue :: Type -> Type #
from :: WireValue -> Rep WireValue x #
to :: Rep WireValue x -> WireValue #
type Rep Day :: Type -> Type #
from :: Day -> Rep Day x #
to :: Rep Day x -> Day #
type Rep UTCTime :: Type -> Type #
from :: UTCTime -> Rep UTCTime x #
to :: Rep UTCTime x -> UTCTime #
type Rep TimeOfDay :: Type -> Type #
from :: TimeOfDay -> Rep TimeOfDay x #
to :: Rep TimeOfDay x -> TimeOfDay #
docPrec :: Int -> CI a -> Doc #
doc :: CI a -> Doc #
docList :: [CI a] -> Doc #
docPrec :: Int -> Entity a -> Doc #
doc :: Entity a -> Doc #
docList :: [Entity a] -> Doc #
docPrec :: Int -> Vector a -> Doc #
doc :: Vector a -> Doc #
docList :: [Vector a] -> Doc #
docPrec :: Int -> Fixed a -> Doc #
doc :: Fixed a -> Doc #
docList :: [Fixed a] -> Doc #
docPrec :: Int -> Map a b -> Doc #
doc :: Map a b -> Doc #
docList :: [Map a b] -> Doc #
type Rep (Fixed a) :: Type -> Type #
from :: Fixed a -> Rep (Fixed a) x #
to :: Rep (Fixed a) x -> Fixed a #