Parsing.hs (pandoc-2.11.1.1) | : | Parsing.hs (pandoc-2.11.2) | ||
---|---|---|---|---|
skipping to change at line 80 | skipping to change at line 80 | |||
, ignore | , ignore | |||
, withRaw | , withRaw | |||
, keyvals | , keyvals | |||
, verbEnv | , verbEnv | |||
, begin_ | , begin_ | |||
, end_ | , end_ | |||
, getRawCommand | , getRawCommand | |||
, skipopts | , skipopts | |||
, rawopt | , rawopt | |||
, overlaySpecification | , overlaySpecification | |||
, getNextNumber | ||||
) where | ) where | |||
import Control.Applicative (many, (<|>)) | import Control.Applicative (many, (<|>)) | |||
import Control.Monad | import Control.Monad | |||
import Control.Monad.Except (throwError) | import Control.Monad.Except (throwError) | |||
import Control.Monad.Trans (lift) | import Control.Monad.Trans (lift) | |||
import Data.Char (chr, isAlphaNum, isDigit, isLetter, ord) | import Data.Char (chr, isAlphaNum, isDigit, isLetter, ord) | |||
import Data.Default | import Data.Default | |||
import Data.List (intercalate) | import Data.List (intercalate) | |||
import qualified Data.Map as M | import qualified Data.Map as M | |||
skipping to change at line 850 | skipping to change at line 851 | |||
isFontSizeCommand "scriptsize" = True | isFontSizeCommand "scriptsize" = True | |||
isFontSizeCommand "footnotesize" = True | isFontSizeCommand "footnotesize" = True | |||
isFontSizeCommand "small" = True | isFontSizeCommand "small" = True | |||
isFontSizeCommand "normalsize" = True | isFontSizeCommand "normalsize" = True | |||
isFontSizeCommand "large" = True | isFontSizeCommand "large" = True | |||
isFontSizeCommand "Large" = True | isFontSizeCommand "Large" = True | |||
isFontSizeCommand "LARGE" = True | isFontSizeCommand "LARGE" = True | |||
isFontSizeCommand "huge" = True | isFontSizeCommand "huge" = True | |||
isFontSizeCommand "Huge" = True | isFontSizeCommand "Huge" = True | |||
isFontSizeCommand _ = False | isFontSizeCommand _ = False | |||
getNextNumber :: Monad m | ||||
=> (LaTeXState -> DottedNum) -> LP m DottedNum | ||||
getNextNumber getCurrentNum = do | ||||
st <- getState | ||||
let chapnum = | ||||
case sLastHeaderNum st of | ||||
DottedNum (n:_) | sHasChapters st -> Just n | ||||
_ -> Nothing | ||||
return . DottedNum $ | ||||
case getCurrentNum st of | ||||
DottedNum [m,n] -> | ||||
case chapnum of | ||||
Just m' | m' == m -> [m, n+1] | ||||
| otherwise -> [m', 1] | ||||
Nothing -> [1] | ||||
-- shouldn't happen | ||||
DottedNum [n] -> | ||||
case chapnum of | ||||
Just m -> [m, 1] | ||||
Nothing -> [n + 1] | ||||
_ -> | ||||
case chapnum of | ||||
Just n -> [n, 1] | ||||
Nothing -> [1] | ||||
End of changes. 2 change blocks. | ||||
0 lines changed or deleted | 1 lines changed or added |