Safe Haskell | None |
---|---|
Language | Haskell2010 |
Pretty printer for Types
Synopsis
- data PrettyPrintType
- = PPTUnknown Int
- | PPTypeVar Text
- | PPTypeLevelString PSString
- | PPTypeWildcard (Maybe Text)
- | PPTypeConstructor (Qualified (ProperName TypeName))
- | PPTypeOp (Qualified (OpName TypeOpName))
- | PPSkolem Text Int
- | PPTypeApp PrettyPrintType PrettyPrintType
- | PPConstrainedType PrettyPrintConstraint PrettyPrintType
- | PPKindedType PrettyPrintType (Kind ())
- | PPBinaryNoParensType PrettyPrintType PrettyPrintType PrettyPrintType
- | PPParensInType PrettyPrintType
- | PPForAll [(Text, Maybe (Kind ()))] PrettyPrintType
- | PPFunction PrettyPrintType PrettyPrintType
- | PPRecord [(Label, PrettyPrintType)] (Maybe PrettyPrintType)
- | PPRow [(Label, PrettyPrintType)] (Maybe PrettyPrintType)
- | PPTruncated
- type PrettyPrintConstraint = (Qualified (ProperName ClassName), [PrettyPrintType])
- convertPrettyPrintType :: Int -> Type a -> PrettyPrintType
- typeAsBox :: Int -> Type a -> Box
- suggestedTypeAsBox :: PrettyPrintType -> Box
- prettyPrintType :: Int -> Type a -> String
- prettyPrintTypeWithUnicode :: Int -> Type a -> String
- prettyPrintSuggestedType :: Type a -> String
- typeAtomAsBox :: Int -> Type a -> Box
- prettyPrintTypeAtom :: Int -> Type a -> String
- prettyPrintLabel :: Label -> Text
- prettyPrintObjectKey :: PSString -> Text
Documentation
data PrettyPrintType Source #
type PrettyPrintConstraint = (Qualified (ProperName ClassName), [PrettyPrintType]) Source #
convertPrettyPrintType :: Int -> Type a -> PrettyPrintType Source #
prettyPrintType :: Int -> Type a -> String Source #
Generate a pretty-printed string representing a Type
prettyPrintTypeWithUnicode :: Int -> Type a -> String Source #
Generate a pretty-printed string representing a Type
using unicode
symbols where applicable
prettyPrintSuggestedType :: Type a -> String Source #
Generate a pretty-printed string representing a suggested Type
prettyPrintTypeAtom :: Int -> Type a -> String Source #
Generate a pretty-printed string representing a Type, as it should appear inside parentheses
prettyPrintLabel :: Label -> Text Source #
prettyPrintObjectKey :: PSString -> Text Source #