[Haskell-cafe] Problems with code blocks in the description field in a .cabal file

Josef Svenningsson josef.svenningsson at gmail.com
Mon Feb 4 14:33:24 CET 2013


On Mon, Feb 4, 2013 at 1:26 PM, Mateusz Kowalczyk
<fuuzetsu at fuuzetsu.co.uk>wrote:

> I don't understand why you're putting it in your .cabal file. Isn't
> something like 3.8.5 over at [1] what you're trying to achieve?
>
> Right, I probably should have mentioned that the reason I put it in the
.cabal file is that the cabal package I'm putting together is an
executable. So I want the documentation to show up on the index page.


> ...
>
> I had a look at a package ([2]) that I know uses a multi-line code block
> example. Here's what I found in its cabal file:
>     An example:
>     .
>     > runShpider $ do
>     >      download "http://apage.com"
>     >      theForm : _ <- getFormsByAction "http://anotherpage.com"
>     >      sendForm $ fillOutForm theForm $ pairs $ do
>     >            "occupation" =: "unemployed Haskell programmer"
>     >            "location" =: "mother's house"
>     .
>
> Depending on your mail client, the `>' signs might get quoted.
>
> Yes. I have no problems including code in general. It's when I have things
inside curly braces that I get a parse error. And that's exactly what I
would like to have.

Thanks,

Josef



> [1] - http://www.haskell.org/haddock/doc/html/ch03s08.html
> [2] -
>
> http://hackage.haskell.org/packages/archive/shpider/0.2.1.1/doc/html/Network-Shpider.html
>
> On 04/02/13 12:30, Josef Svenningsson wrote:
> > Hi,
> >
> > I'm putting together a cabal package and I'd like to have some code
> > examples in my description file. In particular I would like to have a
> > code block containing markdown containing a code block of Haskell, like
> > this:
> >
> >> ~~~{ .haskell }
> >> module Main where
> >>
> >> main = putStrLn "Hello World!"
> >> ~~~
> >
> > When I put the above code in my .cabal file and do `cabal haddock
> > --executables` I get the following error:
> >
> > haddock: failed to parse haddock prologue from file:
> > dist/doc/html/codeExtract/codeExtract/haddock-prolog31969.txt
> >
> > In general I can provoke the parse error from haddock whenever I have
> > something inside curly braces.
> >
> > So the error seems to stem from haddock. I've tried to track down what
> > happens inside haddock but I've run out steam. I'd like to know if there
> > is anything I can do to be able to write something like the above as
> > part of the description in my .cabal file.
> >
> > Thanks,
> >
> > Josef
> >
> >
> > _______________________________________________
> > Haskell-Cafe mailing list
> > Haskell-Cafe at haskell.org
> > http://www.haskell.org/mailman/listinfo/haskell-cafe
> >
>
> _______________________________________________
> Haskell-Cafe mailing list
> Haskell-Cafe at haskell.org
> http://www.haskell.org/mailman/listinfo/haskell-cafe
>
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://www.haskell.org/pipermail/haskell-cafe/attachments/20130204/166b2595/attachment.htm>


More information about the Haskell-Cafe mailing list