Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
data Constraint Source #
Instances
Eq Constraint Source # | |
Defined in Nix.Type.Infer (==) :: Constraint -> Constraint -> Bool # (/=) :: Constraint -> Constraint -> Bool # | |
Ord Constraint Source # | |
Defined in Nix.Type.Infer 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 showsPrec :: Int -> Constraint -> ShowS # show :: Constraint -> String # showList :: [Constraint] -> ShowS # |
data InferError Source #
TypeInferenceErrors [TypeError] | |
TypeInferenceAborted | |
forall s.Exception s => EvaluationError s |
Instances
Show InferError Source # | |
Defined in Nix.Type.Infer showsPrec :: Int -> InferError -> ShowS # show :: InferError -> String # showList :: [InferError] -> ShowS # | |
Semigroup InferError Source # | |
Defined in Nix.Type.Infer (<>) :: InferError -> InferError -> InferError # sconcat :: NonEmpty InferError -> InferError # stimes :: Integral b => b -> InferError -> InferError # | |
Monoid InferError Source # | |
Defined in Nix.Type.Infer mempty :: InferError # mappend :: InferError -> InferError -> InferError # mconcat :: [InferError] -> InferError # | |
Exception InferError Source # | |
Defined in Nix.Type.Infer toException :: InferError -> SomeException # fromException :: SomeException -> Maybe InferError # displayException :: InferError -> String # |