Build #1 for urlcheck-0.1.1

[all reports]

Package urlcheck-0.1.1
Install BuildFailed
Docs NotTried
Tests NotTried
Time submitted unknown
Compiler ghc-7.6.3
OS linux
Arch x86_64
Dependencies old-time-1.1.0.1, network-2.4.1.2, mtl-2.1.2, containers-0.5.0.0, bytestring-0.10.0.2, base-4.6.0.1
Flags small_base

Code Coverage

No Code Coverage was submitted for this report.

Build log

[view raw]

Resolving dependencies...
Downloading urlcheck-0.1.1...
Configuring urlcheck-0.1.1...
Building urlcheck-0.1.1...
Preprocessing executable 'urlcheck' for urlcheck-0.1.1...
[1 of 2] Compiling TinyHTTP         ( TinyHTTP.hs, dist/build/urlcheck/urlcheck-tmp/TinyHTTP.o )
[2 of 2] Compiling Main             ( Check.hs, dist/build/urlcheck/urlcheck-tmp/Main.o )

Check.hs:115:19:
    Could not deduce (GHC.Exception.Exception e1)
      arising from a use of `handle'
    from the context (Num a)
      bound by the inferred type of
               thread :: Num a =>
                         Chan [Char]
                         -> Chan Job -> MVar a -> Maybe (String, Integer) -> t -> IO ()
      at Check.hs:(103,1)-(122,62)
    The type variable `e1' is ambiguous
    Possible fix: add a type signature that fixes these type variable(s)
    Note: there are several potential instances:
      instance GHC.Exception.Exception
                 Control.Exception.Base.NestedAtomically
        -- Defined in `Control.Exception.Base'
      instance GHC.Exception.Exception
                 Control.Exception.Base.NoMethodError
        -- Defined in `Control.Exception.Base'
      instance GHC.Exception.Exception
                 Control.Exception.Base.NonTermination
        -- Defined in `Control.Exception.Base'
      ...plus 15 others
    In a stmt of a 'do' block:
      mn <- handle (return . Left . show) (getStatus uri proxy)
    In the expression:
      do { mn <- handle (return . Left . show) (getStatus uri proxy);
           case mn of {
             Right 200 -> return ()
             Right n -> next (show n)
             Left err -> next err } }
    In a case alternative:
        Just uri
          -> do { mn <- handle (return . Left . show) (getStatus uri proxy);
                  case mn of {
                    Right 200 -> return ()
                    Right n -> next (show n)
                    Left err -> next err } }

Check.hs:115:43:
    Could not deduce (Show e1) arising from a use of `show'
    from the context (Num a)
      bound by the inferred type of
               thread :: Num a =>
                         Chan [Char]
                         -> Chan Job -> MVar a -> Maybe (String, Integer) -> t -> IO ()
      at Check.hs:(103,1)-(122,62)
    The type variable `e1' is ambiguous
    Possible fix: add a type signature that fixes these type variable(s)
    Note: there are several potential instances:
      instance Show Network.PortID -- Defined in `Network'
      instance Show URI -- Defined in `Network.URI'
      instance Show URIAuth -- Defined in `Network.URI'
      ...plus 91 others
    In the second argument of `(.)', namely `show'
    In the second argument of `(.)', namely `Left . show'
    In the first argument of `handle', namely `(return . Left . show)'

Check.hs:194:12:
    No instance for (GHC.Exception.Exception e0)
      arising from a use of `handle'
    The type variable `e0' is ambiguous
    Possible fix: add a type signature that fixes these type variable(s)
    Note: there are several potential instances:
      instance GHC.Exception.Exception
                 Control.Exception.Base.NestedAtomically
        -- Defined in `Control.Exception.Base'
      instance GHC.Exception.Exception
                 Control.Exception.Base.NoMethodError
        -- Defined in `Control.Exception.Base'
      instance GHC.Exception.Exception
                 Control.Exception.Base.NonTermination
        -- Defined in `Control.Exception.Base'
      ...plus 15 others
    In the expression: handle (\ _ -> return Nothing)
    In the expression:
      handle (\ _ -> return Nothing)
      $ do { env <- M.fromList `fmap` getEnvironment;
             return
             $!
               do { s <- M.lookup "http_proxy" env;
                    a <- parseURI s;
                    .... } }
    In an equation for `getProxy':
        getProxy
          = handle (\ _ -> return Nothing)
            $ do { env <- M.fromList `fmap` getEnvironment;
                   return
                   $!
                     do { s <- M.lookup "http_proxy" env;
                          .... } }
Failed to install urlcheck-0.1.1
cabal: Error: some packages failed to install:
urlcheck-0.1.1 failed during the building phase. The exception was:
ExitFailure 1

Test log

No test log was submitted for this report.