throwable-exceptions: throwable-exceptions gives the easy way to throw exceptions

[ exception, library, mit ] [ Propose Tags ]

throwable-exceptions gives the easy way to throw exceptions


[Skip to Readme]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 0.1.0.0, 0.1.0.1, 0.1.0.2, 0.1.0.3, 0.1.0.4, 0.1.0.5, 0.1.0.6, 0.1.0.7, 0.1.0.8, 0.1.0.9
Dependencies base (>=4.7 && <5), safe-exceptions, template-haskell, throwable-exceptions [details]
License MIT
Copyright aiya000
Author aiya000
Maintainer aiya000.develop@gmail.com
Category Exception
Home page https://github.com/aiya000/hs-throwable-exceptions#README.md
Uploaded by aiya000 at 2017-06-21T10:58:44Z
Distributions
Reverse Dependencies 1 direct, 0 indirect [details]
Executables throwable-exception-example
Downloads 6417 total (27 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2017-06-21 [all 1 reports]

Readme for throwable-exceptions-0.1.0.6

[back to package description]

♦️ throwable-exceptions ♦️

Build Status Hackage

throwable-exceptions gives an easy way to create the data types of Exception instance with TemplateHaskell, and gives simple data types of Exception instance with its value constructor, for your haskell project 🐶

📚 Document is available in here 📚

💪 Why should we use this ? 💪

We want to throw some exception frequently, but the mostly throwable exceptions are not given by base.
throwable-exceptions complements it 👍

Examples

  • vvv The summary of the exact examples is available here vvv

You can create a data type of Exception instance by a line

{-# LANGUAGE TemplateHaskell #-}
module Main where

declareException "MyException"
-- ^^^
-- This is same to write below line yourself
--     data MyException a = MyException
--      { myExceptionCause :: String
--      , MyExceptionClue  :: a --      } deriving (Show, Typeable)
--     instance (Typeable a, Show a) => Exception (MyException a)

main :: IO ()
main = do
  print $ MyException "hi" 10
  print $ myException "poi"

Several exceptions are defined by default 😄

For example, IOException's value constructor is not given :cry: But you can use `Control.Exception.Throwable.IOException'` instead :dog:

module Main where

main :: IO ()
main = do
  throwM $ IOException' "oops!" "in main"
  throwM $ ioException' "oops!"

👍

PR is welcome !