cabal update

followed by

cabal upgrade yesod 

did it for me.

Thanks.
Amitava

On Wed, May 4, 2011 at 3:06 PM, Amitava Shee <amitava.shee@gmail.com> wrote:
I have cabal installed yesod already and the app runs fine with runhaskell. I get the error only when invoked via wai-handler-devel.

-Amitava


On Wed, May 4, 2011 at 2:45 PM, Grant Weyburne <weyburne@gmail.com> wrote:
Hi Amitava,

In case you are missing the yesod module.

cabal install yesod

(some small changes to get this to work with wai developer and yesod >= 7)

Grant

{-# LANGUAGE TypeFamilies, QuasiQuotes, MultiParamTypeClasses, TemplateHaskell, OverloadedStrings #-}

module HelloWorld where

import Yesod

data HelloWorld = HelloWorld

mkYesod "HelloWorld" [parseRoutes|
/ HomeR GET
|]

instance Yesod HelloWorld where
    approot _ = ""

getHomeR = defaultLayout [hamlet|Hello World!|]

withHelloWorld  f = toWaiApp HelloWorld >>= f

main = warpDebug 3000 HelloWorld




2011/5/4 Amitava Shee <amitava.shee@gmail.com>
I am reading the yesod book - http://www.yesodweb.com/book/basics

Can someone help me resolve the following issue?

amitava$ wai-handler-devel 3000 HelloWorld withHelloWorld
Attempting to interpret your app...
Compile failed:

Could not find module `Yesod':
  Use -v to see a list of the files searched for.

Furthermore, the -v option is not recognized by wai-handler-dev. I am assuming this is a message from the underlying compiler. How do I pass compiler/interpreter flags from wai-devel-handler?

Thanks & Regards,
Amitava Shee

There are two ways of constructing a software design. One is to make it so simple that there are obviously no deficiencies; the other is to make it so complicated that there are no obvious deficiencies. The first method is far more difficult.
-- C. A. R. Hoare The Emperor's Old Clothes, CACM February 1981

_______________________________________________
web-devel mailing list
web-devel@haskell.org
http://www.haskell.org/mailman/listinfo/web-devel





--
Amitava Shee
Software Architect


There are two ways of constructing a software design. One is to make it so simple that there are obviously no deficiencies; the other is to make it so complicated that there are no obvious deficiencies. The first method is far more difficult.
-- C. A. R. Hoare The Emperor's Old Clothes, CACM February 1981



--
Amitava Shee
Software Architect

There are two ways of constructing a software design. One is to make it so simple that there are obviously no deficiencies; the other is to make it so complicated that there are no obvious deficiencies. The first method is far more difficult.
-- C. A. R. Hoare The Emperor's Old Clothes, CACM February 1981