Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Generics.Diff.Instances
Contents
Description
Here we define orphan instances for as many base
types as we can. These fall into a few categories:
- Primitive types e.g.
Char
andInt
- these typically don't have Generic instances, so we useeqDiff
- Opaque types that don't expose constructors, so we couldn't write hand-rolled instances if we want to -
all we have is an
Eq
instance, so again we useeqDiff
. - Compound types e.g.
Maybe
andEither
- these haveGeneric
instances so we can just usegdiff
. - List-like types such as
[a]
and
- these we give slightly special treatment, since they're so ubiquitous andNonEmpty
agdiff
would produce very hard-to-read output.
Orphan instances
Diff ByteArray Source # | |
Diff DataRep Source # | |
Diff E0 Source # | |
Diff E1 Source # | |
Diff E12 Source # | |
Diff E2 Source # | |
Diff E3 Source # | |
Diff E6 Source # | |
Diff E9 Source # | |
Diff All Source # | |
Diff Any Source # | |
Diff TypeRep Source # | |
Diff Unique Source # | |
Diff Version Source # | |
Diff Errno Source # | |
Diff CBool Source # | |
Diff CChar Source # | |
Diff CClock Source # | |
Diff CDouble Source # | |
Diff CFloat Source # | |
Diff CInt Source # | |
Diff CIntMax Source # | |
Diff CIntPtr Source # | |
Diff CLLong Source # | |
Diff CLong Source # | |
Diff CPtrdiff Source # | |
Diff CSChar Source # | |
Diff CSUSeconds Source # | |
Methods diff :: CSUSeconds -> CSUSeconds -> DiffResult CSUSeconds Source # diffList :: [CSUSeconds] -> [CSUSeconds] -> DiffResult [CSUSeconds] Source # | |
Diff CShort Source # | |
Diff CSigAtomic Source # | |
Methods diff :: CSigAtomic -> CSigAtomic -> DiffResult CSigAtomic Source # diffList :: [CSigAtomic] -> [CSigAtomic] -> DiffResult [CSigAtomic] Source # | |
Diff CSize Source # | |
Diff CTime Source # | |
Diff CUChar Source # | |
Diff CUInt Source # | |
Diff CUIntMax Source # | |
Diff CUIntPtr Source # | |
Diff CULLong Source # | |
Diff CULong Source # | |
Diff CUSeconds Source # | |
Diff CUShort Source # | |
Diff CWchar Source # | |
Diff IntPtr Source # | |
Diff WordPtr Source # | |
Diff Void Source # | |
Diff ByteOrder Source # | |
Diff BlockReason Source # | |
Methods diff :: BlockReason -> BlockReason -> DiffResult BlockReason Source # diffList :: [BlockReason] -> [BlockReason] -> DiffResult [BlockReason] Source # | |
Diff ThreadId Source # | |
Diff ThreadStatus Source # | |
Methods diff :: ThreadStatus -> ThreadStatus -> DiffResult ThreadStatus Source # diffList :: [ThreadStatus] -> [ThreadStatus] -> DiffResult [ThreadStatus] Source # | |
Diff Event Source # | |
Diff Lifetime Source # | |
Diff FdKey Source # | |
Diff TimeoutKey Source # | |
Methods diff :: TimeoutKey -> TimeoutKey -> DiffResult TimeoutKey Source # diffList :: [TimeoutKey] -> [TimeoutKey] -> DiffResult [TimeoutKey] Source # | |
Diff ErrorCall Source # | |
Diff ArithException Source # | |
Methods diff :: ArithException -> ArithException -> DiffResult ArithException Source # diffList :: [ArithException] -> [ArithException] -> DiffResult [ArithException] Source # | |
Diff Fingerprint Source # | |
Methods diff :: Fingerprint -> Fingerprint -> DiffResult Fingerprint Source # diffList :: [Fingerprint] -> [Fingerprint] -> DiffResult [Fingerprint] Source # | |
Diff Associativity Source # | |
Methods diff :: Associativity -> Associativity -> DiffResult Associativity Source # diffList :: [Associativity] -> [Associativity] -> DiffResult [Associativity] Source # | |
Diff DecidedStrictness Source # | |
Methods diff :: DecidedStrictness -> DecidedStrictness -> DiffResult DecidedStrictness Source # diffList :: [DecidedStrictness] -> [DecidedStrictness] -> DiffResult [DecidedStrictness] Source # | |
Diff Fixity Source # | |
Diff MaskingState Source # | |
Methods diff :: MaskingState -> MaskingState -> DiffResult MaskingState Source # diffList :: [MaskingState] -> [MaskingState] -> DiffResult [MaskingState] Source # | |
Diff BufferState Source # | |
Methods diff :: BufferState -> BufferState -> DiffResult BufferState Source # diffList :: [BufferState] -> [BufferState] -> DiffResult [BufferState] Source # | |
Diff IODeviceType Source # | |
Methods diff :: IODeviceType -> IODeviceType -> DiffResult IODeviceType Source # diffList :: [IODeviceType] -> [IODeviceType] -> DiffResult [IODeviceType] Source # | |
Diff SeekMode Source # | |
Diff ArrayException Source # | |
Methods diff :: ArrayException -> ArrayException -> DiffResult ArrayException Source # diffList :: [ArrayException] -> [ArrayException] -> DiffResult [ArrayException] Source # | |
Diff AsyncException Source # | |
Methods diff :: AsyncException -> AsyncException -> DiffResult AsyncException Source # diffList :: [AsyncException] -> [AsyncException] -> DiffResult [AsyncException] Source # | |
Diff ExitCode Source # | |
Diff IOErrorType Source # | |
Methods diff :: IOErrorType -> IOErrorType -> DiffResult IOErrorType Source # diffList :: [IOErrorType] -> [IOErrorType] -> DiffResult [IOErrorType] Source # | |
Diff IOException Source # | |
Methods diff :: IOException -> IOException -> DiffResult IOException Source # diffList :: [IOException] -> [IOException] -> DiffResult [IOException] Source # | |
Diff HandlePosn Source # | |
Methods diff :: HandlePosn -> HandlePosn -> DiffResult HandlePosn Source # diffList :: [HandlePosn] -> [HandlePosn] -> DiffResult [HandlePosn] Source # | |
Diff BufferMode Source # | |
Methods diff :: BufferMode -> BufferMode -> DiffResult BufferMode Source # diffList :: [BufferMode] -> [BufferMode] -> DiffResult [BufferMode] Source # | |
Diff Handle Source # | |
Diff Newline Source # | |
Diff NewlineMode Source # | |
Methods diff :: NewlineMode -> NewlineMode -> DiffResult NewlineMode Source # diffList :: [NewlineMode] -> [NewlineMode] -> DiffResult [NewlineMode] Source # | |
Diff IOMode Source # | |
Diff InfoProv Source # | |
Diff Int16 Source # | |
Diff Int32 Source # | |
Diff Int64 Source # | |
Diff Int8 Source # | |
Diff StackEntry Source # | |
Methods diff :: StackEntry -> StackEntry -> DiffResult StackEntry Source # diffList :: [StackEntry] -> [StackEntry] -> DiffResult [StackEntry] Source # | |
Diff SrcLoc Source # | |
Diff SomeChar Source # | |
Diff SomeSymbol Source # | |
Methods diff :: SomeSymbol -> SomeSymbol -> DiffResult SomeSymbol Source # diffList :: [SomeSymbol] -> [SomeSymbol] -> DiffResult [SomeSymbol] Source # | |
Diff SomeNat Source # | |
Diff GeneralCategory Source # | |
Methods diff :: GeneralCategory -> GeneralCategory -> DiffResult GeneralCategory Source # diffList :: [GeneralCategory] -> [GeneralCategory] -> DiffResult [GeneralCategory] Source # | |
Diff Word16 Source # | |
Diff Word32 Source # | |
Diff Word64 Source # | |
Diff Word8 Source # | |
Diff Timeout Source # | |
Diff Lexeme Source # | |
Diff Ordering Source # | |
Diff TrName Source # | |
Diff TyCon Source # | |
Diff UnicodeException Source # | |
Methods diff :: UnicodeException -> UnicodeException -> DiffResult UnicodeException Source # diffList :: [UnicodeException] -> [UnicodeException] -> DiffResult [UnicodeException] Source # | |
Diff Text Source # | |
Diff Builder Source # | |
Diff Text Source # | |
Diff Integer Source # | |
Diff Natural Source # | |
Diff () Source # | |
Methods diff :: () -> () -> DiffResult () Source # diffList :: [()] -> [()] -> DiffResult [()] Source # | |
Diff Bool Source # | |
Diff Char Source # | |
Diff Double Source # | |
Diff Float Source # | |
Diff Int Source # | |
Diff Word Source # | |
Diff (Chan a) Source # | |
Diff (MutableByteArray a) Source # | |
Methods diff :: MutableByteArray a -> MutableByteArray a -> DiffResult (MutableByteArray a) Source # diffList :: [MutableByteArray a] -> [MutableByteArray a] -> DiffResult [MutableByteArray a] Source # | |
Diff a => Diff (Complex a) Source # | |
Diff a => Diff (Identity a) Source # | |
Diff a => Diff (First a) Source # | |
Diff a => Diff (Last a) Source # | |
Diff a => Diff (Down a) Source # | |
Diff a => Diff (First a) Source # | |
Diff a => Diff (Last a) Source # | |
Diff a => Diff (Max a) Source # | |
Diff a => Diff (Min a) Source # | |
Diff a => Diff (WrappedMonoid a) Source # | |
Methods diff :: WrappedMonoid a -> WrappedMonoid a -> DiffResult (WrappedMonoid a) Source # diffList :: [WrappedMonoid a] -> [WrappedMonoid a] -> DiffResult [WrappedMonoid a] Source # | |
Diff a => Diff (Dual a) Source # | |
Diff a => Diff (Product a) Source # | |
Diff a => Diff (Sum a) Source # | |
Diff (ConstPtr a) Source # | |
Diff a => Diff (NonEmpty a) Source # | |
Diff (TVar a) Source # | |
Diff (ForeignPtr a) Source # | |
Methods diff :: ForeignPtr a -> ForeignPtr a -> DiffResult (ForeignPtr a) Source # diffList :: [ForeignPtr a] -> [ForeignPtr a] -> DiffResult [ForeignPtr a] Source # | |
Diff (IORef a) Source # | |
Diff (MVar a) Source # | |
Diff (FunPtr a) Source # | |
Diff (Ptr a) Source # | |
Eq a => Diff (Ratio a) Source # | |
Diff (StablePtr a) Source # | |
Diff (StableName a) Source # | |
Methods diff :: StableName a -> StableName a -> DiffResult (StableName a) Source # diffList :: [StableName a] -> [StableName a] -> DiffResult [StableName a] Source # | |
Diff a => Diff (I a) Source # | |
Diff a => Diff (Maybe a) Source # | |
Diff a => Diff [a] Source # | |
Methods diff :: [a] -> [a] -> DiffResult [a] Source # diffList :: [[a]] -> [[a]] -> DiffResult [[a]] Source # | |
(Diff a, Diff b) => Diff (Either a b) Source # | |
(HasDatatypeInfo (Fixed a), All2 Diff (Code (Fixed a))) => Diff (Fixed a) Source # | |
Diff (Proxy a) Source # | |
(Diff a, Diff b) => Diff (Arg a b) Source # | |
Diff (TypeRep a) Source # | |
Diff (IOArray i e) Source # | |
Diff (STRef s a) Source # | |
(Diff a, Diff b) => Diff (a, b) Source # | |
Methods diff :: (a, b) -> (a, b) -> DiffResult (a, b) Source # diffList :: [(a, b)] -> [(a, b)] -> DiffResult [(a, b)] Source # | |
(HasDatatypeInfo (Const a b), All2 Diff (Code (Const a b))) => Diff (Const a b) Source # | |
(HasDatatypeInfo (Ap f a), All2 Diff (Code (Ap f a))) => Diff (Ap f a) Source # | |
(HasDatatypeInfo (Alt f a), All2 Diff (Code (Alt f a))) => Diff (Alt f a) Source # | |
Diff (Coercion a b) Source # | |
Diff (OrderingI a b) Source # | |
Diff (STArray s i a) Source # | |
(HasDatatypeInfo (K a b), All2 Diff (Code (K a b))) => Diff (K a b) Source # | |
(Diff a, Diff b, Diff c) => Diff (a, b, c) Source # | |
Methods diff :: (a, b, c) -> (a, b, c) -> DiffResult (a, b, c) Source # diffList :: [(a, b, c)] -> [(a, b, c)] -> DiffResult [(a, b, c)] Source # | |
(HasDatatypeInfo (Product f g a), All2 Diff (Code (Product f g a))) => Diff (Product f g a) Source # | |
(HasDatatypeInfo (Sum f g a), All2 Diff (Code (Sum f g a))) => Diff (Sum f g a) Source # | |
(Diff a, Diff b, Diff c, Diff d) => Diff (a, b, c, d) Source # | |
Methods diff :: (a, b, c, d) -> (a, b, c, d) -> DiffResult (a, b, c, d) Source # diffList :: [(a, b, c, d)] -> [(a, b, c, d)] -> DiffResult [(a, b, c, d)] Source # | |
(HasDatatypeInfo (Compose f g a), All2 Diff (Code (Compose f g a))) => Diff (Compose f g a) Source # | |
(HasDatatypeInfo ((f :.: g) a), All2 Diff (Code ((f :.: g) a))) => Diff ((f :.: g) a) Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e) => Diff (a, b, c, d, e) Source # | |
Methods diff :: (a, b, c, d, e) -> (a, b, c, d, e) -> DiffResult (a, b, c, d, e) Source # diffList :: [(a, b, c, d, e)] -> [(a, b, c, d, e)] -> DiffResult [(a, b, c, d, e)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f) => Diff (a, b, c, d, e, f) Source # | |
Methods diff :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> DiffResult (a, b, c, d, e, f) Source # diffList :: [(a, b, c, d, e, f)] -> [(a, b, c, d, e, f)] -> DiffResult [(a, b, c, d, e, f)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g) => Diff (a, b, c, d, e, f, g) Source # | |
Methods diff :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> DiffResult (a, b, c, d, e, f, g) Source # diffList :: [(a, b, c, d, e, f, g)] -> [(a, b, c, d, e, f, g)] -> DiffResult [(a, b, c, d, e, f, g)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h) => Diff (a, b, c, d, e, f, g, h) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> DiffResult (a, b, c, d, e, f, g, h) Source # diffList :: [(a, b, c, d, e, f, g, h)] -> [(a, b, c, d, e, f, g, h)] -> DiffResult [(a, b, c, d, e, f, g, h)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i) => Diff (a, b, c, d, e, f, g, h, i) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> DiffResult (a, b, c, d, e, f, g, h, i) Source # diffList :: [(a, b, c, d, e, f, g, h, i)] -> [(a, b, c, d, e, f, g, h, i)] -> DiffResult [(a, b, c, d, e, f, g, h, i)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j) => Diff (a, b, c, d, e, f, g, h, i, j) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> DiffResult (a, b, c, d, e, f, g, h, i, j) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j)] -> [(a, b, c, d, e, f, g, h, i, j)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k) => Diff (a, b, c, d, e, f, g, h, i, j, k) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> [(a, b, c, d, e, f, g, h, i, j, k)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l) => Diff (a, b, c, d, e, f, g, h, i, j, k, l) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> [(a, b, c, d, e, f, g, h, i, j, k, l)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q, Diff r) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q, Diff r, Diff s) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q, Diff r, Diff s, Diff t) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q, Diff r, Diff s, Diff t, Diff u) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q, Diff r, Diff s, Diff t, Diff u, Diff v) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q, Diff r, Diff s, Diff t, Diff u, Diff v, Diff w) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q, Diff r, Diff s, Diff t, Diff u, Diff v, Diff w, Diff x) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q, Diff r, Diff s, Diff t, Diff u, Diff v, Diff w, Diff x, Diff y) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y)] Source # | |
(Diff a, Diff b, Diff c, Diff d, Diff e, Diff f, Diff g, Diff h, Diff i, Diff j, Diff k, Diff l, Diff m, Diff n, Diff o, Diff p, Diff q, Diff r, Diff s, Diff t, Diff u, Diff v, Diff w, Diff x, Diff y, Diff z) => Diff (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) Source # | |
Methods diff :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) -> DiffResult (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) Source # diffList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z)] -> [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z)] -> DiffResult [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z)] Source # |