Popularity
6.7
Declining
Activity
0.0
Stable
14
6
3

Monthly Downloads: 26
Programming language: Haskell
License: BSD 3-clause "New" or "Revised" License
Tags: Testing     Parsing     Hspec    
Latest version: v0.1.0.2

hspec-attoparsec alternatives and similar packages

Based on the "hspec" category.
Alternatively, view hspec-attoparsec alternatives based on common mentions on social networks and blogs.

Do you think we are missing an alternative of hspec-attoparsec or a related project?

Add another 'hspec' Package

README

hspec-attoparsec

Build Status

This (small) package provides handy functions for testing attoparsec parsers with hspec.

To see it in action, what better way is there than looking at hspec-attoparsec's own test suite!

{-# LANGUAGE OverloadedStrings #-}
module Test.Hspec.AttoparsecSpec where

import Control.Applicative
import Data.Attoparsec.Text
import Data.Text
import Test.Hspec
import Test.Hspec.Attoparsec

main :: IO ()
main = hspec spec

spec :: Spec
spec = do
  describe "shouldParse" $
    it "works on: \"x\" ~> char 'x'" $
      ("x" :: Text) ~> char 'x'
        `shouldParse` 'x'

  describe "parseSatisfies" $ do
    it "works on: \"x\" and (=='x')" $
      ("x" :: Text) ~> char 'x'
        `parseSatisfies` (=='x')

    it "\">>>\" satisfies length == 3 when parser as a list of char" $
      (">>>" :: Text) ~> many (char '>')
        `parseSatisfies` ((==3) . Prelude.length)

  describe "shouldFailOn" $
    it "char 'x' fails on \"ha\"" $
      char 'x' `shouldFailOn` ("ha" :: Text)

  describe "shouldSucceedOn" $
    it "char 'x' succeeds on \"x\"" $
      char 'x' `shouldSucceedOn` ("x" :: Text)

  describe "leavesUnconsumed" $
    it "works on \"xa\" ~?> char 'x'" $
      ("xa" :: Text) ~?> char 'x'
        `leavesUnconsumed` "a"

    it "char 'x' leaves nothing unconsumed on \"x\"" $
      ("x" :: Text) ~?> char 'x'
        `leavesUnconsumed` ""