
11 Mar
2009
11 Mar
'09
12:09 p.m.
Don Stewart ha scritto:
manlio_perillo:
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.
They're exported from Data.ByteString.Char8
Then there is something I'm missing. Your code does not compile. Thanks Manlio Perillo