Build #1 for sequent-core-0.2.0.1

[all reports]

Package sequent-core-0.2.0.1
Install InstallOk
Docs Ok
Tests NotTried
Time submitted 2015-01-30 01:55:13.990236 UTC
Compiler ghc-7.8.3
OS linux
Arch x86_64
Dependencies transformers-0.3.0.0, ghc-7.8.3, containers-0.5.5.1, base-4.7.0.1
Flags none

Code Coverage

No Code Coverage was submitted for this report.

Build log

[view raw]

Resolving dependencies...
Downloading sequent-core-0.2.0.1...
Configuring sequent-core-0.2.0.1...
Building sequent-core-0.2.0.1...
Preprocessing library sequent-core-0.2.0.1...
[ 1 of 13] Compiling Language.SequentCore.Util ( src/Language/SequentCore/Util.hs, dist/build/Language/SequentCore/Util.o )
[ 2 of 13] Compiling Language.SequentCore.Simpl.Monad ( src/Language/SequentCore/Simpl/Monad.hs, dist/build/Language/SequentCore/Simpl/Monad.o )

src/Language/SequentCore/Simpl/Monad.hs:8:1: Warning:
    The import of ‘Outputable’ is redundant
      except perhaps to import instances from ‘Outputable’
    To import instances alone, use: import Outputable()
[ 3 of 13] Compiling Language.SequentCore.Syntax[boot] ( src/Language/SequentCore/Syntax.hs-boot, dist/build/Language/SequentCore/Syntax.o-boot )
[ 4 of 13] Compiling Language.SequentCore.Translate[boot] ( src/Language/SequentCore/Translate.hs-boot, dist/build/Language/SequentCore/Translate.o-boot )
[ 5 of 13] Compiling Language.SequentCore.Syntax ( src/Language/SequentCore/Syntax.hs, dist/build/Language/SequentCore/Syntax.o )
[ 6 of 13] Compiling Language.SequentCore.Pretty ( src/Language/SequentCore/Pretty.hs, dist/build/Language/SequentCore/Pretty.o )
[ 7 of 13] Compiling Language.SequentCore.Translate ( src/Language/SequentCore/Translate.hs, dist/build/Language/SequentCore/Translate.o )
[ 8 of 13] Compiling Language.SequentCore.Plugin ( src/Language/SequentCore/Plugin.hs, dist/build/Language/SequentCore/Plugin.o )
[ 9 of 13] Compiling Language.SequentCore.Dump ( src/Language/SequentCore/Dump.hs, dist/build/Language/SequentCore/Dump.o )
[10 of 13] Compiling Language.SequentCore.Simpl.Env ( src/Language/SequentCore/Simpl/Env.hs, dist/build/Language/SequentCore/Simpl/Env.o )
[11 of 13] Compiling Language.SequentCore.Simpl ( src/Language/SequentCore/Simpl.hs, dist/build/Language/SequentCore/Simpl.o )
[12 of 13] Compiling Language.SequentCore.SpecConstr ( src/Language/SequentCore/SpecConstr.hs, dist/build/Language/SequentCore/SpecConstr.o )
[13 of 13] Compiling Language.SequentCore ( src/Language/SequentCore.hs, dist/build/Language/SequentCore.o )
In-place registering sequent-core-0.2.0.1...
Preprocessing executable 'DumpExpl' for sequent-core-0.2.0.1...
[1 of 1] Compiling Main             ( examples/Example.hs, dist/build/DumpExpl/DumpExpl-tmp/Main.o )
Loading package ghc-prim ... linking ... done.
Loading package integer-gmp ... linking ... done.
Loading package base ... linking ... done.
Loading package array-0.5.0.0 ... linking ... done.
Loading package deepseq-1.3.0.2 ... linking ... done.
Loading package containers-0.5.5.1 ... linking ... done.
Loading package bytestring-0.10.4.0 ... linking ... done.
Loading package filepath-1.3.0.2 ... linking ... done.
Loading package old-locale-1.0.0.6 ... linking ... done.
Loading package time-1.4.2 ... linking ... done.
Loading package unix-2.7.0.1 ... linking ... done.
Loading package directory-1.2.1.0 ... linking ... done.
Loading package pretty-1.1.1.1 ... linking ... done.
Loading package process-1.2.0.0 ... linking ... done.
Loading package Cabal-1.18.1.3 ... linking ... done.
Loading package binary-0.7.1.0 ... linking ... done.
Loading package bin-package-db-0.0.0.0 ... linking ... done.
Loading package hoopl-3.10.0.1 ... linking ... done.
Loading package hpc-0.6.0.1 ... linking ... done.
Loading package template-haskell ... linking ... done.
Loading package transformers-0.3.0.0 ... linking ... done.
Loading package ghc-7.8.3 ... linking ... done.
Loading package sequent-core-0.2.0.1 ... linking ... done.
 Main.fib
   :: forall a a.
      (GHC.Num.Num a, GHC.Num.Num a, GHC.Classes.Eq a) =>
      a -> a
 [LclIdX, Str=DmdType]
 Main.fib =
   \ (@ a)
     (@ a)
     ($dNum_a164 :: GHC.Num.Num a)
     ($dNum_a165 :: GHC.Num.Num a)
     ($dEq_a166 :: GHC.Classes.Eq a) ->
     let
       { rec
           { fib [Occ=LoopBreaker] :: a -> a
             [LclId, Str=DmdType]
             fib =
               \ (ds_d1at :: a) ->
                 <GHC.Classes.==
                 | $ @ a
                 ; $ $dEq_a166
                 ; $ ds_d1at
                 ; $ <GHC.Num.fromInteger
                     | $ @ a
                     ; $ $dNum_a165
                     ; $ __integer 0
                     >
                 ; case of _ [Occ=Dead]
                     { GHC.Types.False ->
                         <\ _ [Occ=Dead, OS=OneShot] ->
                            <GHC.Classes.==
                            | $ @ a
                            ; $ $dEq_a166
                            ; $ ds_d1at
                            ; $ <GHC.Num.fromInteger
                                | $ @ a
                                ; $ $dNum_a165
                                ; $ __integer 1
                                >
                            ; case of _ [Occ=Dead]
                                { GHC.Types.False ->
                                    <\ _ [Occ=Dead, OS=OneShot] ->
                                       <GHC.Num.+
                                       | $ @ a
                                       ; $ $dNum_a164
                                       ; $ <fib
                                           | $ <GHC.Num.-
                                               | $ @ a
                                               ; $ $dNum_a165
                                               ; $ ds_d1at
                                               ; $ <GHC.Num.fromInteger
                                                   | $ @ a
                                                   ; $ $dNum_a165
                                                   ; $ __integer 1
                                                   >
                                               >
                                           >
                                       ; $ <fib
                                           | $ <GHC.Num.-
                                               | $ @ a
                                               ; $ $dNum_a165
                                               ; $ ds_d1at
                                               ; $ <GHC.Num.fromInteger
                                                   | $ @ a
                                                   ; $ $dNum_a165
                                                   ; $ __integer 2
                                                   >
                                               >
                                           >
                                       >
                                    | $ GHC.Prim.void#
                                    >
                                ; GHC.Types.True ->
                                    <GHC.Num.fromInteger
                                    | $ @ a
                                    ; $ $dNum_a164
                                    ; $ __integer 1
                                    >
                                }
                            >
                         | $ GHC.Prim.void#
                         >
                     ; GHC.Types.True ->
                         <GHC.Num.fromInteger
                         | $ @ a
                         ; $ $dNum_a164
                         ; $ __integer 0
                         >
                     }
                 >
            
           }
        
       }
     in fib
 
 Main.fibs :: [GHC.Integer.Type.Integer]
 [LclIdX, Str=DmdType]
 Main.fibs =
   let
     { rec
         { fibs [Occ=LoopBreaker] :: [GHC.Integer.Type.Integer]
           [LclId, Str=DmdType]
           fibs =
             : (@ GHC.Integer.Type.Integer)
               (__integer 0)
               (: (@ GHC.Integer.Type.Integer)
                  (__integer 1)
                  <GHC.List.zipWith
                  | $ @ GHC.Integer.Type.Integer
                  ; $ @ GHC.Integer.Type.Integer
                  ; $ @ GHC.Integer.Type.Integer
                  ; $ <GHC.Num.+
                      | $ @ GHC.Integer.Type.Integer
                      ; $ GHC.Num.$fNumInteger
                      >
                  ; $ fibs
                  ; $ <GHC.List.tail
                      | $ @ GHC.Integer.Type.Integer
                      ; $ fibs
                      >
                  >)
          
         }
      
     }
   in fibs
 
 Main.main :: GHC.Types.IO ()
 [LclIdX, Str=DmdType]
 Main.main =
   <GHC.Classes.==
   | $ @ GHC.Integer.Type.Integer
   ; $ GHC.Integer.Type.$fEqInteger
   ; $ <Main.fib
       | $ @ GHC.Integer.Type.Integer
       ; $ @ GHC.Integer.Type.Integer
       ; $ GHC.Num.$fNumInteger
       ; $ GHC.Num.$fNumInteger
       ; $ GHC.Integer.Type.$fEqInteger
       ; $ __integer 10
       >
   ; $ <GHC.List.!!
       | $ @ GHC.Integer.Type.Integer
       ; $ Main.fibs
       ; $ GHC.Types.I# 10
       >
   ; case of _ [Occ=Dead]
       { GHC.Types.False ->
           <System.IO.putStrLn
           | $ <GHC.CString.unpackCString#
               | $ "Boo!"#
               >
           >
       ; GHC.Types.True ->
           <System.IO.putStrLn
           | $ <GHC.CString.unpackCString#
               | $ "Yay!"#
               >
           >
       }
   >
 
 rec
   { Main.f [Occ=LoopBreaker] :: GHC.Types.Int -> GHC.Types.Int
     [LclIdX, Str=DmdType]
     Main.f =
       \ (x :: GHC.Types.Int) ->
         <GHC.Classes.>
         | $ @ GHC.Integer.Type.Integer
         ; $ GHC.Integer.Type.$fOrdInteger
         ; $ <Main.fib
             | $ @ GHC.Integer.Type.Integer
             ; $ @ GHC.Integer.Type.Integer
             ; $ GHC.Num.$fNumInteger
             ; $ GHC.Num.$fNumInteger
             ; $ GHC.Integer.Type.$fEqInteger
             ; $ __integer 100
             >
         ; $ __integer 10
         ; case of _ [Occ=Dead]
             { GHC.Types.False -> GHC.Types.I# 0
             ; GHC.Types.True ->
                 <Main.f
                 | $ <GHC.Num.+
                     | $ @ GHC.Types.Int
                     ; $ GHC.Num.$fNumInt
                     ; $ x
                     ; $ GHC.Types.I# 1
                     >
                 >
             }
         >
    
   }
 
 Main.sum :: [GHC.Types.Int] -> GHC.Types.Int
 [LclIdX, Str=DmdType]
 Main.sum =
   let
     { rec
         { sum' [Occ=LoopBreaker]
             :: GHC.Types.Int -> [GHC.Types.Int] -> GHC.Types.Int
           [LclId, Str=DmdType]
           sum' =
             \ (a :: GHC.Types.Int) (ds_d1as :: [GHC.Types.Int]) ->
               <ds_d1as
               | case of _ [Occ=Dead]
                   { [] -> a
                   ; : x xs ->
                       <sum'
                       | $ <GHC.Num.+
                           | $ @ GHC.Types.Int
                           ; $ GHC.Num.$fNumInt
                           ; $ a
                           ; $ x
                           >
                       ; $ xs
                       >
                   }
               >
          
         }
      
     }
   in <sum'
      | $ GHC.Types.I# 0
      >
 
 :Main.main :: GHC.Types.IO ()
 [LclIdX, Str=DmdType]
 :Main.main =
   <GHC.TopHandler.runMainIO
   | $ @ ()
   ; $ Main.main
   >
 

[1 of 1] Compiling Main             ( examples/Example.hs, dist/build/DumpExpl/DumpExpl-tmp/Main.o ) [Language.SequentCore.Dump changed]
Loading package ghc-prim ... linking ... done.
Loading package integer-gmp ... linking ... done.
Loading package base ... linking ... done.
Loading package array-0.5.0.0 ... linking ... done.
Loading package deepseq-1.3.0.2 ... linking ... done.
Loading package containers-0.5.5.1 ... linking ... done.
Loading package bytestring-0.10.4.0 ... linking ... done.
Loading package filepath-1.3.0.2 ... linking ... done.
Loading package old-locale-1.0.0.6 ... linking ... done.
Loading package time-1.4.2 ... linking ... done.
Loading package unix-2.7.0.1 ... linking ... done.
Loading package directory-1.2.1.0 ... linking ... done.
Loading package pretty-1.1.1.1 ... linking ... done.
Loading package process-1.2.0.0 ... linking ... done.
Loading package Cabal-1.18.1.3 ... linking ... done.
Loading package binary-0.7.1.0 ... linking ... done.
Loading package bin-package-db-0.0.0.0 ... linking ... done.
Loading package hoopl-3.10.0.1 ... linking ... done.
Loading package hpc-0.6.0.1 ... linking ... done.
Loading package template-haskell ... linking ... done.
Loading package transformers-0.3.0.0 ... linking ... done.
Loading package ghc-7.8.3 ... linking ... done.
Loading package sequent-core-0.2.0.1 ... linking ... done.
 Main.fib
   :: forall a a.
      (GHC.Num.Num a, GHC.Num.Num a, GHC.Classes.Eq a) =>
      a -> a
 [LclIdX, Str=DmdType]
 Main.fib =
   \ (@ a)
     (@ a)
     ($dNum_a164 :: GHC.Num.Num a)
     ($dNum_a165 :: GHC.Num.Num a)
     ($dEq_a166 :: GHC.Classes.Eq a) ->
     let
       { rec
           { fib [Occ=LoopBreaker] :: a -> a
             [LclId, Str=DmdType]
             fib =
               \ (ds_d1at :: a) ->
                 <GHC.Classes.==
                 | $ @ a
                 ; $ $dEq_a166
                 ; $ ds_d1at
                 ; $ <GHC.Num.fromInteger
                     | $ @ a
                     ; $ $dNum_a165
                     ; $ __integer 0
                     >
                 ; case of _ [Occ=Dead]
                     { GHC.Types.False ->
                         <\ _ [Occ=Dead, OS=OneShot] ->
                            <GHC.Classes.==
                            | $ @ a
                            ; $ $dEq_a166
                            ; $ ds_d1at
                            ; $ <GHC.Num.fromInteger
                                | $ @ a
                                ; $ $dNum_a165
                                ; $ __integer 1
                                >
                            ; case of _ [Occ=Dead]
                                { GHC.Types.False ->
                                    <\ _ [Occ=Dead, OS=OneShot] ->
                                       <GHC.Num.+
                                       | $ @ a
                                       ; $ $dNum_a164
                                       ; $ <fib
                                           | $ <GHC.Num.-
                                               | $ @ a
                                               ; $ $dNum_a165
                                               ; $ ds_d1at
                                               ; $ <GHC.Num.fromInteger
                                                   | $ @ a
                                                   ; $ $dNum_a165
                                                   ; $ __integer 1
                                                   >
                                               >
                                           >
                                       ; $ <fib
                                           | $ <GHC.Num.-
                                               | $ @ a
                                               ; $ $dNum_a165
                                               ; $ ds_d1at
                                               ; $ <GHC.Num.fromInteger
                                                   | $ @ a
                                                   ; $ $dNum_a165
                                                   ; $ __integer 2
                                                   >
                                               >
                                           >
                                       >
                                    | $ GHC.Prim.void#
                                    >
                                ; GHC.Types.True ->
                                    <GHC.Num.fromInteger
                                    | $ @ a
                                    ; $ $dNum_a164
                                    ; $ __integer 1
                                    >
                                }
                            >
                         | $ GHC.Prim.void#
                         >
                     ; GHC.Types.True ->
                         <GHC.Num.fromInteger
                         | $ @ a
                         ; $ $dNum_a164
                         ; $ __integer 0
                         >
                     }
                 >
            
           }
        
       }
     in fib
 
 Main.fibs :: [GHC.Integer.Type.Integer]
 [LclIdX, Str=DmdType]
 Main.fibs =
   let
     { rec
         { fibs [Occ=LoopBreaker] :: [GHC.Integer.Type.Integer]
           [LclId, Str=DmdType]
           fibs =
             : (@ GHC.Integer.Type.Integer)
               (__integer 0)
               (: (@ GHC.Integer.Type.Integer)
                  (__integer 1)
                  <GHC.List.zipWith
                  | $ @ GHC.Integer.Type.Integer
                  ; $ @ GHC.Integer.Type.Integer
                  ; $ @ GHC.Integer.Type.Integer
                  ; $ <GHC.Num.+
                      | $ @ GHC.Integer.Type.Integer
                      ; $ GHC.Num.$fNumInteger
                      >
                  ; $ fibs
                  ; $ <GHC.List.tail
                      | $ @ GHC.Integer.Type.Integer
                      ; $ fibs
                      >
                  >)
          
         }
      
     }
   in fibs
 
 Main.main :: GHC.Types.IO ()
 [LclIdX, Str=DmdType]
 Main.main =
   <GHC.Classes.==
   | $ @ GHC.Integer.Type.Integer
   ; $ GHC.Integer.Type.$fEqInteger
   ; $ <Main.fib
       | $ @ GHC.Integer.Type.Integer
       ; $ @ GHC.Integer.Type.Integer
       ; $ GHC.Num.$fNumInteger
       ; $ GHC.Num.$fNumInteger
       ; $ GHC.Integer.Type.$fEqInteger
       ; $ __integer 10
       >
   ; $ <GHC.List.!!
       | $ @ GHC.Integer.Type.Integer
       ; $ Main.fibs
       ; $ GHC.Types.I# 10
       >
   ; case of _ [Occ=Dead]
       { GHC.Types.False ->
           <System.IO.putStrLn
           | $ <GHC.CString.unpackCString#
               | $ "Boo!"#
               >
           >
       ; GHC.Types.True ->
           <System.IO.putStrLn
           | $ <GHC.CString.unpackCString#
               | $ "Yay!"#
               >
           >
       }
   >
 
 rec
   { Main.f [Occ=LoopBreaker] :: GHC.Types.Int -> GHC.Types.Int
     [LclIdX, Str=DmdType]
     Main.f =
       \ (x :: GHC.Types.Int) ->
         <GHC.Classes.>
         | $ @ GHC.Integer.Type.Integer
         ; $ GHC.Integer.Type.$fOrdInteger
         ; $ <Main.fib
             | $ @ GHC.Integer.Type.Integer
             ; $ @ GHC.Integer.Type.Integer
             ; $ GHC.Num.$fNumInteger
             ; $ GHC.Num.$fNumInteger
             ; $ GHC.Integer.Type.$fEqInteger
             ; $ __integer 100
             >
         ; $ __integer 10
         ; case of _ [Occ=Dead]
             { GHC.Types.False -> GHC.Types.I# 0
             ; GHC.Types.True ->
                 <Main.f
                 | $ <GHC.Num.+
                     | $ @ GHC.Types.Int
                     ; $ GHC.Num.$fNumInt
                     ; $ x
                     ; $ GHC.Types.I# 1
                     >
                 >
             }
         >
    
   }
 
 Main.sum :: [GHC.Types.Int] -> GHC.Types.Int
 [LclIdX, Str=DmdType]
 Main.sum =
   let
     { rec
         { sum' [Occ=LoopBreaker]
             :: GHC.Types.Int -> [GHC.Types.Int] -> GHC.Types.Int
           [LclId, Str=DmdType]
           sum' =
             \ (a :: GHC.Types.Int) (ds_d1as :: [GHC.Types.Int]) ->
               <ds_d1as
               | case of _ [Occ=Dead]
                   { [] -> a
                   ; : x xs ->
                       <sum'
                       | $ <GHC.Num.+
                           | $ @ GHC.Types.Int
                           ; $ GHC.Num.$fNumInt
                           ; $ a
                           ; $ x
                           >
                       ; $ xs
                       >
                   }
               >
          
         }
      
     }
   in <sum'
      | $ GHC.Types.I# 0
      >
 
 :Main.main :: GHC.Types.IO ()
 [LclIdX, Str=DmdType]
 :Main.main =
   <GHC.TopHandler.runMainIO
   | $ @ ()
   ; $ Main.main
   >
 

Linking dist/build/DumpExpl/DumpExpl ...
Preprocessing executable 'SpecConstrExpl' for sequent-core-0.2.0.1...
[1 of 1] Compiling Main             ( examples/SpecConstrExpl.hs, dist/build/SpecConstrExpl/SpecConstrExpl-tmp/Main.o )
Loading package ghc-prim ... linking ... done.
Loading package integer-gmp ... linking ... done.
Loading package base ... linking ... done.
Loading package array-0.5.0.0 ... linking ... done.
Loading package deepseq-1.3.0.2 ... linking ... done.
Loading package containers-0.5.5.1 ... linking ... done.
Loading package bytestring-0.10.4.0 ... linking ... done.
Loading package filepath-1.3.0.2 ... linking ... done.
Loading package old-locale-1.0.0.6 ... linking ... done.
Loading package time-1.4.2 ... linking ... done.
Loading package unix-2.7.0.1 ... linking ... done.
Loading package directory-1.2.1.0 ... linking ... done.
Loading package pretty-1.1.1.1 ... linking ... done.
Loading package process-1.2.0.0 ... linking ... done.
Loading package Cabal-1.18.1.3 ... linking ... done.
Loading package binary-0.7.1.0 ... linking ... done.
Loading package bin-package-db-0.0.0.0 ... linking ... done.
Loading package hoopl-3.10.0.1 ... linking ... done.
Loading package hpc-0.6.0.1 ... linking ... done.
Loading package template-haskell ... linking ... done.
Loading package transformers-0.3.0.0 ... linking ... done.
Loading package ghc-7.8.3 ... linking ... done.
Loading package sequent-core-0.2.0.1 ... linking ... done.

<no location info>: Could not find SpecConstr pass to replace
[1 of 1] Compiling Main             ( examples/SpecConstrExpl.hs, dist/build/SpecConstrExpl/SpecConstrExpl-tmp/Main.o ) [Language.SequentCore.SpecConstr changed]
Loading package ghc-prim ... linking ... done.
Loading package integer-gmp ... linking ... done.
Loading package base ... linking ... done.
Loading package array-0.5.0.0 ... linking ... done.
Loading package deepseq-1.3.0.2 ... linking ... done.
Loading package containers-0.5.5.1 ... linking ... done.
Loading package bytestring-0.10.4.0 ... linking ... done.
Loading package filepath-1.3.0.2 ... linking ... done.
Loading package old-locale-1.0.0.6 ... linking ... done.
Loading package time-1.4.2 ... linking ... done.
Loading package unix-2.7.0.1 ... linking ... done.
Loading package directory-1.2.1.0 ... linking ... done.
Loading package pretty-1.1.1.1 ... linking ... done.
Loading package process-1.2.0.0 ... linking ... done.
Loading package Cabal-1.18.1.3 ... linking ... done.
Loading package binary-0.7.1.0 ... linking ... done.
Loading package bin-package-db-0.0.0.0 ... linking ... done.
Loading package hoopl-3.10.0.1 ... linking ... done.
Loading package hpc-0.6.0.1 ... linking ... done.
Loading package template-haskell ... linking ... done.
Loading package transformers-0.3.0.0 ... linking ... done.
Loading package ghc-7.8.3 ... linking ... done.
Loading package sequent-core-0.2.0.1 ... linking ... done.

<no location info>: Could not find SpecConstr pass to replace
Linking dist/build/SpecConstrExpl/SpecConstrExpl ...
Preprocessing executable 'SimplExpl' for sequent-core-0.2.0.1...
[1 of 1] Compiling Main             ( examples/Compl.hs, dist/build/SimplExpl/SimplExpl-tmp/Main.o )
Loading package ghc-prim ... linking ... done.
Loading package integer-gmp ... linking ... done.
Loading package base ... linking ... done.
Loading package array-0.5.0.0 ... linking ... done.
Loading package deepseq-1.3.0.2 ... linking ... done.
Loading package containers-0.5.5.1 ... linking ... done.
Loading package bytestring-0.10.4.0 ... linking ... done.
Loading package filepath-1.3.0.2 ... linking ... done.
Loading package old-locale-1.0.0.6 ... linking ... done.
Loading package time-1.4.2 ... linking ... done.
Loading package unix-2.7.0.1 ... linking ... done.
Loading package directory-1.2.1.0 ... linking ... done.
Loading package pretty-1.1.1.1 ... linking ... done.
Loading package process-1.2.0.0 ... linking ... done.
Loading package Cabal-1.18.1.3 ... linking ... done.
Loading package binary-0.7.1.0 ... linking ... done.
Loading package bin-package-db-0.0.0.0 ... linking ... done.
Loading package hoopl-3.10.0.1 ... linking ... done.
Loading package hpc-0.6.0.1 ... linking ... done.
Loading package template-haskell ... linking ... done.
Loading package transformers-0.3.0.0 ... linking ... done.
Loading package ghc-7.8.3 ... linking ... done.
Loading package sequent-core-0.2.0.1 ... linking ... done.
[1 of 1] Compiling Main             ( examples/Compl.hs, dist/build/SimplExpl/SimplExpl-tmp/Main.o ) [Language.SequentCore.Simpl changed]
Loading package ghc-prim ... linking ... done.
Loading package integer-gmp ... linking ... done.
Loading package base ... linking ... done.
Loading package array-0.5.0.0 ... linking ... done.
Loading package deepseq-1.3.0.2 ... linking ... done.
Loading package containers-0.5.5.1 ... linking ... done.
Loading package bytestring-0.10.4.0 ... linking ... done.
Loading package filepath-1.3.0.2 ... linking ... done.
Loading package old-locale-1.0.0.6 ... linking ... done.
Loading package time-1.4.2 ... linking ... done.
Loading package unix-2.7.0.1 ... linking ... done.
Loading package directory-1.2.1.0 ... linking ... done.
Loading package pretty-1.1.1.1 ... linking ... done.
Loading package process-1.2.0.0 ... linking ... done.
Loading package Cabal-1.18.1.3 ... linking ... done.
Loading package binary-0.7.1.0 ... linking ... done.
Loading package bin-package-db-0.0.0.0 ... linking ... done.
Loading package hoopl-3.10.0.1 ... linking ... done.
Loading package hpc-0.6.0.1 ... linking ... done.
Loading package template-haskell ... linking ... done.
Loading package transformers-0.3.0.0 ... linking ... done.
Loading package ghc-7.8.3 ... linking ... done.
Loading package sequent-core-0.2.0.1 ... linking ... done.
Linking dist/build/SimplExpl/SimplExpl ...
Running Haddock for sequent-core-0.2.0.1...
Running hscolour for sequent-core-0.2.0.1...
Preprocessing library sequent-core-0.2.0.1...
Preprocessing executable 'DumpExpl' for sequent-core-0.2.0.1...
Preprocessing executable 'SpecConstrExpl' for sequent-core-0.2.0.1...
Preprocessing executable 'SimplExpl' for sequent-core-0.2.0.1...
Preprocessing library sequent-core-0.2.0.1...

src/Language/SequentCore/Simpl/Monad.hs:8:1: Warning:
    The import of ‘Outputable’ is redundant
      except perhaps to import instances from ‘Outputable’
    To import instances alone, use: import Outputable()
Haddock coverage:
  33% (  1 /  3) in 'Language.SequentCore.Util'
   0% (  0 /  9) in 'Language.SequentCore.Simpl.Monad'
 100% ( 49 / 49) in 'Language.SequentCore.Syntax'
 100% (  2 /  2) in 'Language.SequentCore.Pretty'
 100% ( 12 / 12) in 'Language.SequentCore.Translate'
 100% (  2 /  2) in 'Language.SequentCore.Plugin'
 100% (  2 /  2) in 'Language.SequentCore.Dump'
   2% (  1 / 47) in 'Language.SequentCore.Simpl.Env'
 100% (  2 /  2) in 'Language.SequentCore.Simpl'
 100% (  2 /  2) in 'Language.SequentCore.SpecConstr'
 100% (  5 /  5) in 'Language.SequentCore'
Documentation created: dist/doc/html/sequent-core/index.html,
dist/doc/html/sequent-core/sequent-core.txt
Preprocessing executable 'DumpExpl' for sequent-core-0.2.0.1...
Preprocessing executable 'SpecConstrExpl' for sequent-core-0.2.0.1...
Preprocessing executable 'SimplExpl' for sequent-core-0.2.0.1...
Creating package registration file: /tmp/pkgConf-sequent-core-0.2.031410.1
Installing library in
/home/builder/hackage-server/build-cache/tmp-install/lib/x86_64-linux-ghc-7.8.3/sequent-core-0.2.0.1
Installing executable(s) in
/home/builder/hackage-server/build-cache/tmp-install/bin
Warning: The directory
/home/builder/hackage-server/build-cache/tmp-install/bin is not in the system
search path.
Registering sequent-core-0.2.0.1...
Installed sequent-core-0.2.0.1

Test log

No test log was submitted for this report.