Metadata revisions for hgrev-0.1.2

Package maintainers and Hackage trustees are allowed to edit certain bits of package metadata after a release, without uploading a new tarball. Note that the tarball itself is never changed, just the metadata that is stored separately. For more information about metadata revisions, please refer to the Hackage Metadata Revisions FAQ.

No. Time User SHA256
-r4 (hgrev-0.1.2-r4) 2015-09-28T15:13:30Z LukeHoersten 149e4250d8ab7802d4b497e5037259eba35d868b367577cbd1910b3b85e896ca
  • Changed description from

    [Overview]
    
    `hgrev` provides two modules:
    * `Development.HgRev` - <https://mercurial.selenic.com Mercurial (hg)> Haskell API
    * `Development.HgRev.TH` - Template Haskell splice to compile version info into Haskell code
    
    Use @$(hgRevStateTH defFormat)@ with Template Haskell enabled to insert the
    formatted version string.
    
    [Requirements]
    
    `hgrev` requires the `hg` binary is installed and available on the system.
    `Development.HgRev.HgRev` and `Development.HgRev.HgState` are obtained via two
    separate calls to `hg` because working directory state isn't available programmatically.
    
    [Usage Example]
    
    > module Example where
    >
    > import           Data.Monoid          ((<>))
    > import           Data.Text            (Text, pack)
    > import           Development.HgRev.TH (defFormat, hgRevStateTH, jsonFormat)
    > import           Options.Applicative  (Parser, ParserInfo, execParser, fullDesc,
    >                                        help, helper, info, infoOption, long,
    >                                        progDesc, short)
    >
    > main :: IO ()
    > main = execParser parserInfo >> return ()
    >
    > verSwitch :: Parser (a -> a)
    > verSwitch =
    >     infoOption ("HG rev: " <> $(hgRevStateTH defFormat))
    >     $  long "version"
    >     <> short 'v'
    >     <> help "Display version information"
    >
    > jsonSwitch :: Parser (a -> a)
    > jsonSwitch =
    >     infoOption $(hgRevStateTH jsonFormat)
    >     $  long "json"
    >     <> short 'J'
    >     <> help "Display JSON version information"
    >
    > parserInfo :: ParserInfo (a -> a)
    > parserInfo = info (helper <*> verSwitch <* jsonSwitch) fullDesc
    >
    
    Check out the <https://hackage.haskell.org/package/gitrev gitrev> package for similar git functionality.
    to
    [Overview]
    
    `hgrev` provides two modules:
    
    * `Development.HgRev` - <https://mercurial.selenic.com Mercurial (hg)> Haskell API
    
    * `Development.HgRev.TH` - Template Haskell splice to compile version info into Haskell code
    
    Use @$(hgRevStateTH defFormat)@ with Template Haskell enabled to insert the
    formatted version string.
    
    [Requirements]
    
    `hgrev` requires the `hg` binary is installed and available on the system.
    `Development.HgRev.HgRev` and `Development.HgRev.HgState` are obtained via two
    separate calls to `hg` because working directory state isn't available programmatically.
    
    [Usage Example]
    
    > module Example where
    >
    > import           Data.Monoid          ((<>))
    > import           Data.Text            (Text, pack)
    > import           Development.HgRev.TH (defFormat, hgRevStateTH, jsonFormat)
    > import           Options.Applicative  (Parser, ParserInfo, execParser, fullDesc,
    >                                        help, helper, info, infoOption, long,
    >                                        progDesc, short)
    >
    > main :: IO ()
    > main = execParser parserInfo >> return ()
    >
    > verSwitch :: Parser (a -> a)
    > verSwitch =
    >     infoOption ("HG rev: " <> $(hgRevStateTH defFormat))
    >     $  long "version"
    >     <> short 'v'
    >     <> help "Display version information"
    >
    > jsonSwitch :: Parser (a -> a)
    > jsonSwitch =
    >     infoOption $(hgRevStateTH jsonFormat)
    >     $  long "json"
    >     <> short 'J'
    >     <> help "Display JSON version information"
    >
    > parserInfo :: ParserInfo (a -> a)
    > parserInfo = info (helper <*> verSwitch <* jsonSwitch) fullDesc
    >
    
    Check out the <https://hackage.haskell.org/package/gitrev gitrev> package for similar git functionality.

-r3 (hgrev-0.1.2-r3) 2015-09-28T15:11:58Z LukeHoersten 750d6b084fd5253e884cb8822154a87f05f34a814a4f8f45d7261b94c44776bf
  • Changed description from

    [Overview]
    
    `hgrev` provides two modules:
    - `Development.HgRev` - <https://mercurial.selenic.com Mercurial (hg)> Haskell API
    - `Development.HgRev.TH` - Template Haskell splice to compile version info into Haskell code
    
    Use @$(hgRevStateTH defFormat)@ with Template Haskell enabled to insert the
    formatted version string.
    
    [Requirements]
    
    `hgrev` requires the `hg` binary is installed and available on the system.
    `Development.HgRev.HgRev` and `Development.HgRev.HgState` are obtained via two
    separate calls to `hg` because working directory state isn't available programmatically.
    
    [Usage Example]
    
    > module Example where
    >
    > import           Data.Monoid          ((<>))
    > import           Data.Text            (Text, pack)
    > import           Development.HgRev.TH (defFormat, hgRevStateTH, jsonFormat)
    > import           Options.Applicative  (Parser, ParserInfo, execParser, fullDesc,
    >                                        help, helper, info, infoOption, long,
    >                                        progDesc, short)
    >
    > main :: IO ()
    > main = execParser parserInfo >> return ()
    >
    > verSwitch :: Parser (a -> a)
    > verSwitch =
    >     infoOption ("HG rev: " <> $(hgRevStateTH defFormat))
    >     $  long "version"
    >     <> short 'v'
    >     <> help "Display version information"
    >
    > jsonSwitch :: Parser (a -> a)
    > jsonSwitch =
    >     infoOption $(hgRevStateTH jsonFormat)
    >     $  long "json"
    >     <> short 'J'
    >     <> help "Display JSON version information"
    >
    > parserInfo :: ParserInfo (a -> a)
    > parserInfo = info (helper <*> verSwitch <* jsonSwitch) fullDesc
    >
    
    Check out the <https://hackage.haskell.org/package/gitrev gitrev> package for similar git functionality.
    to
    [Overview]
    
    `hgrev` provides two modules:
    * `Development.HgRev` - <https://mercurial.selenic.com Mercurial (hg)> Haskell API
    * `Development.HgRev.TH` - Template Haskell splice to compile version info into Haskell code
    
    Use @$(hgRevStateTH defFormat)@ with Template Haskell enabled to insert the
    formatted version string.
    
    [Requirements]
    
    `hgrev` requires the `hg` binary is installed and available on the system.
    `Development.HgRev.HgRev` and `Development.HgRev.HgState` are obtained via two
    separate calls to `hg` because working directory state isn't available programmatically.
    
    [Usage Example]
    
    > module Example where
    >
    > import           Data.Monoid          ((<>))
    > import           Data.Text            (Text, pack)
    > import           Development.HgRev.TH (defFormat, hgRevStateTH, jsonFormat)
    > import           Options.Applicative  (Parser, ParserInfo, execParser, fullDesc,
    >                                        help, helper, info, infoOption, long,
    >                                        progDesc, short)
    >
    > main :: IO ()
    > main = execParser parserInfo >> return ()
    >
    > verSwitch :: Parser (a -> a)
    > verSwitch =
    >     infoOption ("HG rev: " <> $(hgRevStateTH defFormat))
    >     $  long "version"
    >     <> short 'v'
    >     <> help "Display version information"
    >
    > jsonSwitch :: Parser (a -> a)
    > jsonSwitch =
    >     infoOption $(hgRevStateTH jsonFormat)
    >     $  long "json"
    >     <> short 'J'
    >     <> help "Display JSON version information"
    >
    > parserInfo :: ParserInfo (a -> a)
    > parserInfo = info (helper <*> verSwitch <* jsonSwitch) fullDesc
    >
    
    Check out the <https://hackage.haskell.org/package/gitrev gitrev> package for similar git functionality.

-r2 (hgrev-0.1.2-r2) 2015-09-28T15:07:18Z LukeHoersten bd9af94d0f91e19cd9e08f916efd0c81d943d0ee10266161489f29a602bfa131
  • Changed description from

    [Overview]
    
    `hgrev` provides two modules:
    - `Development.HgRev` - <https://mercurial.selenic.com Mercurial (hg)> Haskell API
    - `Development.HgRev.TH` - Template Haskell splice to compile version info into Haskell code
    
    Use @$(hgRevStateTH defFormat)@ with Template Haskell enabled to insert the
    formatted version string.
    
    [Requirements]
    
    `hgrev` requires the `hg` binary is installed and available on the system.
    `Development.HgRev.HgRev` and `Development.HgRev.HgState` are obtained via two
    separate calls to `hg` because working directory state isn't available programmatically.
    
    [Usage Example]
    
    > {-# LANGUAGE OverloadedStrings #-}
    > {-# LANGUAGE TemplateHaskell   #-}
    >
    > module Example where
    >
    > import           Data.Monoid          ((<>))
    > import           Data.Text            (Text, pack)
    > import           Development.HgRev.TH (defFormat, hgRevStateTH, jsonFormat)
    > import           Options.Applicative  (Parser, ParserInfo, execParser, fullDesc,
    >                                        help, helper, info, infoOption, long,
    >                                        progDesc, short)
    >
    > main :: IO ()
    > main = execParser parserInfo >> return ()
    >
    > verSwitch :: Parser (a -> a)
    > verSwitch =
    >     infoOption ("HG rev: " <> $(hgRevStateTH defFormat))
    >     $  long "version"
    >     <> short 'v'
    >     <> help "Display version information"
    >
    > jsonSwitch :: Parser (a -> a)
    > jsonSwitch =
    >     infoOption $(hgRevStateTH jsonFormat)
    >     $  long "json"
    >     <> short 'J'
    >     <> help "Display JSON version information"
    >
    > parserInfo :: ParserInfo (a -> a)
    > parserInfo = info (helper <*> verSwitch <* jsonSwitch) fullDesc
    >
    
    Check out the <https://hackage.haskell.org/package/gitrev gitrev> package for similar git functionality.
    to
    [Overview]
    
    `hgrev` provides two modules:
    - `Development.HgRev` - <https://mercurial.selenic.com Mercurial (hg)> Haskell API
    - `Development.HgRev.TH` - Template Haskell splice to compile version info into Haskell code
    
    Use @$(hgRevStateTH defFormat)@ with Template Haskell enabled to insert the
    formatted version string.
    
    [Requirements]
    
    `hgrev` requires the `hg` binary is installed and available on the system.
    `Development.HgRev.HgRev` and `Development.HgRev.HgState` are obtained via two
    separate calls to `hg` because working directory state isn't available programmatically.
    
    [Usage Example]
    
    > module Example where
    >
    > import           Data.Monoid          ((<>))
    > import           Data.Text            (Text, pack)
    > import           Development.HgRev.TH (defFormat, hgRevStateTH, jsonFormat)
    > import           Options.Applicative  (Parser, ParserInfo, execParser, fullDesc,
    >                                        help, helper, info, infoOption, long,
    >                                        progDesc, short)
    >
    > main :: IO ()
    > main = execParser parserInfo >> return ()
    >
    > verSwitch :: Parser (a -> a)
    > verSwitch =
    >     infoOption ("HG rev: " <> $(hgRevStateTH defFormat))
    >     $  long "version"
    >     <> short 'v'
    >     <> help "Display version information"
    >
    > jsonSwitch :: Parser (a -> a)
    > jsonSwitch =
    >     infoOption $(hgRevStateTH jsonFormat)
    >     $  long "json"
    >     <> short 'J'
    >     <> help "Display JSON version information"
    >
    > parserInfo :: ParserInfo (a -> a)
    > parserInfo = info (helper <*> verSwitch <* jsonSwitch) fullDesc
    >
    
    Check out the <https://hackage.haskell.org/package/gitrev gitrev> package for similar git functionality.

-r1 (hgrev-0.1.2-r1) 2015-09-26T19:30:03Z LukeHoersten 55166ce9dfb4df8b40a98bc009c606dabd6b180088042cc425c3b1f1faf7a068
  • Changed description from

    == __Overview__
    
    `hgrev` provides two modules:
    - `Development.HgRev` - <https://mercurial.selenic.com Mercurial (hg)> Haskell API
    - `Development.HgRev.TH` - Template Haskell splice to compile version info into Haskell code
    
    Use @$(hgRevStateTH defFormat)@ with Template Haskell enabled to insert the
    formatted version string.
    
    == __Requirements__
    
    `hgrev` requires the `hg` binary is installed and available on the system.
    `Development.HgRev.HgRev` and `Development.HgRev.HgState` are obtained via two
    separate calls to `hg` because working directory state isn't available programmatically.
    
    == __Usage Example__
    
    > {-# LANGUAGE OverloadedStrings #-}
    > {-# LANGUAGE TemplateHaskell   #-}
    >
    > module Example where
    >
    > import           Data.Monoid          ((<>))
    > import           Data.Text            (Text, pack)
    > import           Development.HgRev.TH (defFormat, hgRevStateTH, jsonFormat)
    > import           Options.Applicative  (Parser, ParserInfo, execParser, fullDesc,
    >                                        help, helper, info, infoOption, long,
    >                                        progDesc, short)
    >
    > main :: IO ()
    > main = execParser parserInfo >> return ()
    >
    > verSwitch :: Parser (a -> a)
    > verSwitch =
    >     infoOption ("HG rev: " <> $(hgRevStateTH defFormat))
    >     $  long "version"
    >     <> short 'v'
    >     <> help "Display version information"
    >
    > jsonSwitch :: Parser (a -> a)
    > jsonSwitch =
    >     infoOption $(hgRevStateTH jsonFormat)
    >     $  long "json"
    >     <> short 'J'
    >     <> help "Display JSON version information"
    >
    > parserInfo :: ParserInfo (a -> a)
    > parserInfo = info (helper <*> verSwitch <* jsonSwitch) fullDesc
    >
    
    Check out the <https://hackage.haskell.org/package/gitrev gitrev> package for similar git functionality.
    to
    [Overview]
    
    `hgrev` provides two modules:
    - `Development.HgRev` - <https://mercurial.selenic.com Mercurial (hg)> Haskell API
    - `Development.HgRev.TH` - Template Haskell splice to compile version info into Haskell code
    
    Use @$(hgRevStateTH defFormat)@ with Template Haskell enabled to insert the
    formatted version string.
    
    [Requirements]
    
    `hgrev` requires the `hg` binary is installed and available on the system.
    `Development.HgRev.HgRev` and `Development.HgRev.HgState` are obtained via two
    separate calls to `hg` because working directory state isn't available programmatically.
    
    [Usage Example]
    
    > {-# LANGUAGE OverloadedStrings #-}
    > {-# LANGUAGE TemplateHaskell   #-}
    >
    > module Example where
    >
    > import           Data.Monoid          ((<>))
    > import           Data.Text            (Text, pack)
    > import           Development.HgRev.TH (defFormat, hgRevStateTH, jsonFormat)
    > import           Options.Applicative  (Parser, ParserInfo, execParser, fullDesc,
    >                                        help, helper, info, infoOption, long,
    >                                        progDesc, short)
    >
    > main :: IO ()
    > main = execParser parserInfo >> return ()
    >
    > verSwitch :: Parser (a -> a)
    > verSwitch =
    >     infoOption ("HG rev: " <> $(hgRevStateTH defFormat))
    >     $  long "version"
    >     <> short 'v'
    >     <> help "Display version information"
    >
    > jsonSwitch :: Parser (a -> a)
    > jsonSwitch =
    >     infoOption $(hgRevStateTH jsonFormat)
    >     $  long "json"
    >     <> short 'J'
    >     <> help "Display JSON version information"
    >
    > parserInfo :: ParserInfo (a -> a)
    > parserInfo = info (helper <*> verSwitch <* jsonSwitch) fullDesc
    >
    
    Check out the <https://hackage.haskell.org/package/gitrev gitrev> package for similar git functionality.

-r0 (hgrev-0.1.2-r0) 2015-09-26T17:48:19Z LukeHoersten 7e262116b6bc1aa8a796fa4055749cf55e58c6a61fc608d1d2aa0523453422bb