Safe Haskell | None |
---|---|
Language | Haskell2010 |
Nix.Type.Infer
Documentation
data Constraint Source #
Instances
Eq Constraint Source # | |
Defined in Nix.Type.Infer | |
Ord Constraint Source # | |
Defined in Nix.Type.Infer Methods compare :: Constraint -> Constraint -> Ordering # (<) :: Constraint -> Constraint -> Bool # (<=) :: Constraint -> Constraint -> Bool # (>) :: Constraint -> Constraint -> Bool # (>=) :: Constraint -> Constraint -> Bool # max :: Constraint -> Constraint -> Constraint # min :: Constraint -> Constraint -> Constraint # | |
Show Constraint Source # | |
Defined in Nix.Type.Infer Methods showsPrec :: Int -> Constraint -> ShowS # show :: Constraint -> String # showList :: [Constraint] -> ShowS # |
Constructors
UnificationFail Type Type | |
InfiniteType TVar Type | |
UnboundVariables [Text] | |
Ambigious [Constraint] | |
UnificationMismatch [Type] [Type] |
Instances
data InferError Source #
Constructors
TypeInferenceErrors [TypeError] | |
TypeInferenceAborted | |
forall s.Exception s => EvaluationError s |
Instances
Show InferError Source # | |
Defined in Nix.Type.Infer Methods showsPrec :: Int -> InferError -> ShowS # show :: InferError -> String # showList :: [InferError] -> ShowS # | |
Semigroup InferError Source # | |
Defined in Nix.Type.Infer Methods (<>) :: InferError -> InferError -> InferError # sconcat :: NonEmpty InferError -> InferError # stimes :: Integral b => b -> InferError -> InferError # | |
Monoid InferError Source # | |
Defined in Nix.Type.Infer Methods mempty :: InferError # mappend :: InferError -> InferError -> InferError # mconcat :: [InferError] -> InferError # | |
Exception InferError Source # | |
Defined in Nix.Type.Infer Methods toException :: InferError -> SomeException # fromException :: SomeException -> Maybe InferError # displayException :: InferError -> String # |