使用attoparsec解析IP地址

时间:2015-12-15 13:57:06

标签: haskell attoparsec

https://www.fpcomplete.com/school/starting-with-haskell/libraries-and-frameworks/text-manipulation/attoparsec处给出的解析器似乎有效,但它有问题。

代码(在此重复)是:

{-# LANGUAGE OverloadedStrings #-}

-- This attoparsec module is intended for parsing text that is
-- represented using an 8-bit character set, e.g. ASCII or ISO-8859-15.
import Data.Attoparsec.Char8
import Data.Word

-- | Type for IP's.
data IP = IP Word8 Word8 Word8 Word8 deriving Show

parseIP :: Parser IP
parseIP = do
  d1 <- decimal
  char '.'
  d2 <- decimal
  char '.'
  d3 <- decimal
  char '.'
  d4 <- decimal
  return $ IP d1 d2 d3 d4

main :: IO ()
main = print $ parseOnly parseIP "131.45.68.123"

如果解析器输入了无效的IP地址,例如&#34; 1000.1000.1000.1000&#34;,它不会失败,并且由于强制数字转换而返回垃圾结果。

有没有一种简单的方法来解决这个问题?一种方法是使用更大的Word类型,如Word32,并检查数字是否小于256.但是,如果输入是病态的,即使可能返回垃圾(例如,溢出Word32好)。转换为Integer似乎是一种选择,因为它是无限制的,但同样,对抗性输入可能会使程序内存不足。

那么避免这些问题的(希望是优雅的)解析器会是什么样的呢?

2 个答案:

答案 0 :(得分:3)

我对您的问题的理解是,您不仅希望在输入数量太大时失败,而且您不希望解析器消耗更多的输入。

我们可以定义一个函数来解析最大值的整数,否则失败:

import Data.Attoparsec.ByteString.Char8
import Data.Word
import Data.ByteString (ByteString)
import qualified Data.ByteString as B
import Control.Applicative
import Data.List (foldl')
import Control.Monad 

decimalMax :: Integral a => Integer -> Parser a 
decimalMax dMax = do  
  let numDigs = ceiling $ log (fromIntegral(dMax+1)) / log 10
      getVal = foldl' (\s d -> s*10+fromIntegral (d-48)) 0 . B.unpack
  val <- getVal <$> scan 0 (\n c -> 
          if n > numDigs || not (isDigit c) then Nothing else Just (n+1)) 
  if val <= dMax 
    then return $ fromIntegral val 
    else fail $ "decimalMax: parsed decimal exceeded" ++ show dMax

此函数计算最大数字中的位数,然后只消耗多少位数。您的IP地址解析器几乎保持不变:

parseIP :: Parser IP
parseIP = IP <$> dd <*> dd <*> dd <*> dig where 
  dig = decimalMax 255
  dd = dig <* char '.' 

main :: IO ()
main = do
  print $ parseOnly parseIP "131.45.68.123"
  print $ parseOnly parseIP "1000.1000.1000.1000"

答案 1 :(得分:1)

对于简单的非病理输入,您确实可以从Word8强制转换Integer,这是任意精度且永远不会溢出:

byte :: Parser Word8
byte = do
    n <- (decimal :: Parser Integer)
    if n < 256 then return n 
               else fail $ "Byte Overflow: " ++ show n ++ " is greater than 255."

现在修改后的程序,

parseIP = do
    d1 <- byte
    char '.'
    d2 <- byte
    char '.'
    d3 <- byte
    char '.'
    d4 <- byte
    return $ IP d1 d2 d3 d4

应该产生必要的输出。

如果您想通过编写“1291293919818283309400919 ...”作为一个非常长的数字来处理那些尝试DoS的人,那么我预见需要做更多的工作来验证某些东西真的那么长,以便您最多扫描在第一个char '.'上立即失败之前的三位数。

以下似乎编译并使用import qualified Data.ByteString as BS顶部:

scan0to3digits :: Int -> Char -> Maybe Int
scan0to3digits  = scan 0 helper where
  helper n c 
    | n < 3 && isDigit c  = Just (n + 1)
    | otherwise           = Nothing

byte :: Parser Word8
byte = do
    raw <- scan 0 scan0to3digits
    let p = BS.foldl' (\sum w8 -> 10 * sum + fromIntegral w8 - 48) 0 raw
    if BS.length raw == 0 
      then fail "Expected one or more digits..."
      else if p > 255
        then fail $ "Byte Overflow: " ++ show n ++ " is greater than 255."
        else return (fromInteger p)