Resolving dependencies... Downloading cmonad-0.1.0.1... Configuring cmonad-0.1.0.1... Building cmonad-0.1.0.1... Preprocessing library cmonad-0.1.0.1... src/Language/CMonad/CPrelude.hs:1:16: Warning: -fglasgow-exts is deprecated: Use individual extensions instead src/Language/CMonad/Prim.hs:1:16: Warning: -fglasgow-exts is deprecated: Use individual extensions instead src/Language/CMonad/Ops.hs:1:16: Warning: -fglasgow-exts is deprecated: Use individual extensions instead [1 of 5] Compiling Language.CMonad.MonadRef ( src/Language/CMonad/MonadRef.hs, dist/build/Language/CMonad/MonadRef.o ) [2 of 5] Compiling Language.CMonad.Prim ( src/Language/CMonad/Prim.hs, dist/build/Language/CMonad/Prim.o ) src/Language/CMonad/Prim.hs:48:13: Couldn't match expected type `forall v. E' v m a' with actual type `E' v0 m a' In the return type of a call of `V' In the first argument of `return', namely `(V (readRef r) (writeRef r))' In a stmt of a 'do' block: return (V (readRef r) (writeRef r)) src/Language/CMonad/Prim.hs:59:12: Couldn't match expected type `forall v. [E m i] -> E' v m a' with actual type `[E m i] -> E' v1 m a' In the first argument of `return', namely `f' In a stmt of a 'do' block: return f In the first argument of `E', namely `(do { let ix :: [E m i] -> m i ix [i] = runE i {-# INLINE f #-} ....; return f })' src/Language/CMonad/Prim.hs:75:13: Couldn't match expected type `[E m i] -> E' v2 m a' with actual type `forall v. [E m i] -> E' v m a' The lambda expression `\ is -> V (ix is >>= readArray a) (\ x -> ...)' has one argument, but its type `forall v. [E m i] -> E' v m a' has none In the first argument of `return', namely `(\ is -> V (ix is >>= readArray a) (\ x -> ix is >>= \ i -> writeArray a i x))' In a stmt of a 'do' block: return (\ is -> V (ix is >>= readArray a) (\ x -> ix is >>= \ i -> writeArray a i x)) Failed to install cmonad-0.1.0.1 cabal: Error: some packages failed to install: cmonad-0.1.0.1 failed during the building phase. The exception was: ExitFailure 1