| Safe Haskell | None | 
|---|---|
| Language | Haskell2010 | 
MatchLit
Synopsis
- dsLit :: HsLit GhcRn -> DsM CoreExpr
- dsOverLit :: HsOverLit GhcTc -> DsM CoreExpr
- hsLitKey :: DynFlags -> HsLit GhcTc -> Literal
- tidyLitPat :: HsLit GhcTc -> Pat GhcTc
- tidyNPat :: HsOverLit GhcTc -> Maybe (SyntaxExpr GhcTc) -> SyntaxExpr GhcTc -> Type -> Pat GhcTc
- matchLiterals :: [Id] -> Type -> [[EquationInfo]] -> DsM MatchResult
- matchNPlusKPats :: [Id] -> Type -> [EquationInfo] -> DsM MatchResult
- matchNPats :: [Id] -> Type -> [EquationInfo] -> DsM MatchResult
- warnAboutIdentities :: DynFlags -> CoreExpr -> Type -> DsM ()
- warnAboutOverflowedOverLit :: HsOverLit GhcTc -> DsM ()
- warnAboutOverflowedLit :: HsLit GhcTc -> DsM ()
- warnAboutEmptyEnumerations :: DynFlags -> LHsExpr GhcTc -> Maybe (LHsExpr GhcTc) -> LHsExpr GhcTc -> DsM ()
Documentation
tidyNPat :: HsOverLit GhcTc -> Maybe (SyntaxExpr GhcTc) -> SyntaxExpr GhcTc -> Type -> Pat GhcTc Source #
matchLiterals :: [Id] -> Type -> [[EquationInfo]] -> DsM MatchResult Source #
matchNPlusKPats :: [Id] -> Type -> [EquationInfo] -> DsM MatchResult Source #
matchNPats :: [Id] -> Type -> [EquationInfo] -> DsM MatchResult Source #
warnAboutOverflowedOverLit :: HsOverLit GhcTc -> DsM () Source #
Emit warnings on overloaded integral literals which overflow the bounds implied by their type.