Resolving dependencies... Configuring parallel-3.2.1.0... Building parallel-3.2.1.0... Installed parallel-3.2.1.0 Configuring cpsa-2.5.0... Building cpsa-2.5.0... Failed to install cpsa-2.5.0 Build log ( /home/builder/.cabal/logs/cpsa-2.5.0.log ): cabal: Entering directory '/tmp/cabal-tmp-29971/cpsa-2.5.0' Configuring cpsa-2.5.0... Building cpsa-2.5.0... Preprocessing executable 'cpsa' for cpsa-2.5.0... [ 1 of 21] Compiling Paths_cpsa ( dist/build/autogen/Paths_cpsa.hs, dist/build/cpsa/cpsa-tmp/Paths_cpsa.o ) [ 2 of 21] Compiling CPSA.Lib.Utilities ( src/CPSA/Lib/Utilities.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Utilities.o ) [ 3 of 21] Compiling CPSA.Lib.SExpr ( src/CPSA/Lib/SExpr.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/SExpr.o ) [ 4 of 21] Compiling CPSA.Lib.Pretty ( src/CPSA/Lib/Pretty.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Pretty.o ) [ 5 of 21] Compiling CPSA.Lib.Printer ( src/CPSA/Lib/Printer.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Printer.o ) [ 6 of 21] Compiling CPSA.Lib.Notation ( src/CPSA/Lib/Notation.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Notation.o ) [ 7 of 21] Compiling CPSA.Lib.Algebra ( src/CPSA/Lib/Algebra.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Algebra.o ) [ 8 of 21] Compiling CPSA.Lib.Protocol ( src/CPSA/Lib/Protocol.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Protocol.o ) [ 9 of 21] Compiling CPSA.Lib.CPSA ( src/CPSA/Lib/CPSA.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/CPSA.o ) [10 of 21] Compiling CPSA.Lib.Goal ( src/CPSA/Lib/Goal.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Goal.o ) [11 of 21] Compiling CPSA.Lib.Strand ( src/CPSA/Lib/Strand.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Strand.o ) [12 of 21] Compiling CPSA.Lib.Characteristic ( src/CPSA/Lib/Characteristic.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Characteristic.o ) [13 of 21] Compiling CPSA.Lib.Cohort ( src/CPSA/Lib/Cohort.hs, dist/build/cpsa/cpsa-tmp/CPSA/Lib/Cohort.o ) src/CPSA/Lib/Cohort.hs:92:7: error: • Could not deduce (Algebra t p3 g3 s3 e2 c3) from the context: (Algebra t p1 g1 s1 e2 c1, Algebra t p2 g2 s2 e2 c2, Algebra t p3 g3 s3 e1 c3) bound by the inferred type for ‘unrealizedInNode’: (Algebra t p1 g1 s1 e2 c1, Algebra t p2 g2 s2 e2 c2, Algebra t p3 g3 s3 e1 c3) => ([Node], Set (Vertex t e2)) -> CPSA.Lib.Strand.GraphNode (Event t) (Instance t e2) -> ([Node], Set (Vertex t e2)) at src/CPSA/Lib/Cohort.hs:(92,7)-(100,51) • In the ambiguity check for the inferred type for ‘unrealizedInNode’ To defer the ambiguity check to use sites, enable AllowAmbiguousTypes When checking the inferred type unrealizedInNode :: forall p g s c p1 g1 s1 c1 p2 g2 s2 e c2 e1. (Algebra t p g s e1 c, Algebra t p1 g1 s1 e1 c1, Algebra t p2 g2 s2 e c2) => ([Node], Set (Vertex t e1)) -> CPSA.Lib.Strand.GraphNode (Event t) (Instance t e1) -> ([Node], Set (Vertex t e1)) In an equation for ‘unrealized’: unrealized k = foldl unrealizedInStrand [] (strands k) where (a, _) = avoid k unrealizedInStrand acc s = fst $ foldl unrealizedInNode (acc, S.empty) (nodes s) unrealizedInNode (acc, ns) n = case inbnd $ event n of { Nothing -> ... Just t -> ... } src/CPSA/Lib/Cohort.hs:245:7: error: • Could not deduce (Algebra t p4 g s e2 c4) from the context: (Algebra t p1 g1 s1 e1 c1, Algebra t p2 g2 s2 e2 c2, Algebra t p3 g3 s3 e2 c3, Algebra t p4 g s e c4) bound by the inferred type for ‘loop’: (Algebra t p1 g1 s1 e1 c1, Algebra t p2 g2 s2 e2 c2, Algebra t p3 g3 s3 e2 c3, Algebra t p4 g s e c4) => [CPSA.Lib.Strand.GraphNode (Event t) (Instance t e2)] -> Maybe [Preskel t g s e] at src/CPSA/Lib/Cohort.hs:(245,7)-(256,67) • In the ambiguity check for the inferred type for ‘loop’ To defer the ambiguity check to use sites, enable AllowAmbiguousTypes When checking the inferred type loop :: forall p g1 s1 e1 c p1 g2 s2 c1 p2 g3 s3 c2 p3 c3 e2. (Algebra t p g1 s1 e1 c, Algebra t p1 g2 s2 e2 c1, Algebra t p2 g3 s3 e2 c2, Algebra t p3 g s e c3) => [CPSA.Lib.Strand.GraphNode (Event t) (Instance t e2)] -> Maybe [Preskel t g s e] In an equation for ‘findTest’: findTest mode k u a = loop (prioritizeVertices k $ nodeOrder mode k) where loop [] = Nothing loop (n : nodes) = case inbnd $ event n of { Nothing -> loop nodes Just t -> ... } src/CPSA/Lib/Cohort.hs:449:7: error: • Could not deduce (Algebra t p3 g s e3 c3) from the context: (Algebra t p1 g s e3 c1, Algebra t p2 g s e1 c2, Algebra t p3 g s e2 c3) bound by the inferred type for ‘loop’: (Algebra t p1 g s e3 c1, Algebra t p2 g s e1 c2, Algebra t p3 g s e2 c3) => Int -> [Event t] -> [((g, s), Instance t e3)] -> [Event t] -> [((g, s), Instance t e3)] at src/CPSA/Lib/Cohort.hs:(449,7)-(457,59) • In the ambiguity check for the inferred type for ‘loop’ To defer the ambiguity check to use sites, enable AllowAmbiguousTypes When checking the inferred type loop :: forall p c p1 e c1 p2 e1 c2 e2. (Algebra t p g s e2 c, Algebra t p1 g s e c1, Algebra t p2 g s e1 c2) => Int -> [Event t] -> [((g, s), Instance t e2)] -> [Event t] -> [((g, s), Instance t e2)] In an equation for ‘transformingNode’: transformingNode ct escape targets role subst = loop 1 [] [] (rtrace role) where loop _ _ acc [] = acc loop ht past acc (In t : c) = loop (ht + 1) (In t : past) acc c loop ht past acc (Out t : c) = loop (ht + 1) (Out t : past) acc' c where substs = carriedBindings targets t subst substs' = cowt ct escape past substs .... src/CPSA/Lib/Cohort.hs:527:7: error: • Could not deduce (Subst t t2 t1) from the context: (Subst t g1 t1, Algebra t p1 t2 s1 e1 c1) bound by the inferred type for ‘f’: (Subst t g1 t1, Algebra t p1 t2 s1 e1 c1) => [((t2, t1), Instance t e1)] -> (t2, t1) -> [((t2, t1), Instance t e1)] at src/CPSA/Lib/Cohort.hs:(527,7)-(532,76) • In the ambiguity check for the inferred type for ‘f’ To defer the ambiguity check to use sites, enable AllowAmbiguousTypes When checking the inferred type f :: forall e t1 t2 g p s c. (Subst t g t1, Algebra t p t2 s e c) => [((t2, t1), Instance t e)] -> (t2, t1) -> [((t2, t1), Instance t e)] In an equation for ‘maybeAug’: maybeAug ct escape role ht substs acc t = foldl f acc $ filter testNotSolved substs where testNotSolved (_, subst) = not $ carriedOnlyWithin (substitute subst ct) (S.map (substitute subst) escape) (substitute subst t) f acc (gen, subst) = case bldInstance role itrace gen of { (gen, inst) : _ -> ... : acc [] -> acc } where itrace = map (evtMap $ substitute subst) (take ht (rtrace role)) cabal: Leaving directory '/tmp/cabal-tmp-29971/cpsa-2.5.0' cabal: Error: some packages failed to install: cpsa-2.5.0 failed during the building phase. The exception was: ExitFailure 1