[Haskell-cafe] ByteString in patterns

Manlio Perillo manlio_perillo at libero.it
Tue Mar 10 20:02:13 EDT 2009


Don Stewart ha scritto:
> [...]
>     {-# LANGUAGE OverloadedStrings #-}
> 
>     import qualified Data.ByteString.Char8 as C
> 
>     isMatch :: C.ByteString -> Bool
>     isMatch "match" = True
>     isMatch _       = False
> 
>     main = print . map isMatch . C.lines =<< C.getContents
> 

What is the reason why instance declarations for IsString class are not 
defined for available ByteStrings?

I need to define it by myself.



Thanks  Manlio Perillo


More information about the Haskell-Cafe mailing list