Safe Haskell | None |
---|---|
Language | Haskell98 |
Helium.StaticAnalysis.Heuristics.RepairHeuristics
Description
Documentation
siblingFunctions :: (MaybeImported info, HasTwoTypes info, WithHints info, HasTypeGraph m info) => Siblings -> Selector m info Source
siblingLiterals :: (HasTypeGraph m info, MaybeLiteral info, HasTwoTypes info, WithHints info) => Selector m info Source
similarNegation :: (HasTypeGraph m info, MaybeNegation info, HasTwoTypes info, WithHints info) => Selector m info Source
applicationHeuristic :: (HasTypeGraph m info, MaybeApplication info, IsPattern info, HasTwoTypes info, WithHints info) => Selector m info Source
tupleHeuristic :: (HasTypeGraph m info, IsTupleEdge info, HasTwoTypes info, WithHints info) => Selector m info Source
class IsFunctionBinding a where Source
Instances
fbHasTooManyArguments :: (HasTypeGraph m info, IsFunctionBinding info, HasTwoTypes info, WithHints info) => Selector m info Source
class IsExprVariable a where Source
Instances
variableFunction :: (HasTypeGraph m info, IsExprVariable info, MaybeApplication info, HasTwoTypes info, WithHints info) => Selector m info Source
class MaybeUnaryMinus a where Source
Instances
unaryMinus :: (HasTypeGraph m info, MaybeApplication info, MaybeUnaryMinus info, HasTwoTypes info, WithHints info) => Bool -> Selector m info Source
zipWithHoles :: [a] -> [b] -> [([Int], [(a, b)])] Source
type Permutation = [Int] Source
permutationsForLength :: Int -> [Permutation] Source
deleteIndex :: Int -> [a] -> [a] Source
permute :: Permutation -> [a] -> [a] Source
class WithHints a where Source
Methods
addHint :: String -> String -> a -> a Source
typeErrorForTerm :: (Bool, Bool) -> Int -> OneLineTree -> (Tp, Tp) -> Range -> a -> a Source
Instances
possibleHint :: WithHints a => String -> a -> a Source
becauseHint :: WithHints a => String -> a -> a Source
unifiableInContext :: ClassEnvironment -> OrderedTypeSynonyms -> [Maybe Predicate] -> Tp -> Tp -> Bool Source
allSubstPredicates :: HasTypeGraph m info => m [Maybe Predicate] Source
predicatesFit :: HasTypeGraph m info => Predicates -> m Bool Source
predicateFits :: HasTypeGraph m info => Predicate -> m Bool Source