[Haskell-cafe] hflags

Maurizio Vitale mrz.vtl at gmail.com
Fri Feb 6 06:26:37 UTC 2015


with ghc 7.8.4 and hflags 0.4 the following program:

{-# LANGUAGE TemplateHaskell #-}

module Main where

import HFlags

defineFlag "f" True "A flag."
--defineFlag "g" True "Another  flag."

main = do
  _ <- $initHFlags "flags demo"
  print Main.flags_f

gives me a runtime error about the flag f not being found, unless I add the
declaration of a second flag. It seems like the last flag definition is not
seen.

Any idea/suggestion?

Thanks,

  Maurizio
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://www.haskell.org/pipermail/haskell-cafe/attachments/20150206/5e4e3c76/attachment-0001.html>


More information about the Haskell-Cafe mailing list