Fix breakableFill.
authorJulien Moutinho <julm+symantic@autogeree.net>
Tue, 6 Mar 2018 03:32:26 +0000 (04:32 +0100)
committerJulien Moutinho <julm+symantic@autogeree.net>
Tue, 6 Mar 2018 03:32:26 +0000 (04:32 +0100)
symantic-document/Language/Symantic/Document/Plain.hs
symantic-document/Language/Symantic/Document/Sym.hs
symantic-document/Language/Symantic/Document/Valid.hs
symantic-document/test/HUnit.hs

index 92766dda8eb6ad0dae4ec994be4f34810a673ae3..9a75c2d72b510fae3ec5e8b32cae76cf6b43f462 100644 (file)
@@ -78,8 +78,8 @@ instance Monoid Plain where
 instance IsString Plain where
        fromString = string
 
-plainWrite :: Column Plain -> TLB.Builder -> Plain
-plainWrite len t =
+writeText :: Column Plain -> TLB.Builder -> Plain
+writeText len t =
        Plain $ \inh st ok ko ->
                let newCol = st + len in
                (if newCol <= inh_wrap_column inh then ok else ko)
@@ -87,10 +87,10 @@ plainWrite len t =
 
 instance Doc_Text Plain where
        empty     = Plain $ \_inh st ok _ko -> ok st ""
-       charH   t = plainWrite 1 $ TLB.singleton t
-       stringH t = plainWrite (List.length t) (fromString t)
-       textH   t = plainWrite (Text.length t) (TLB.fromText t)
-       ltextH  t = plainWrite (intOfInt64 $ TL.length t) (TLB.fromLazyText t)
+       charH   t = writeText 1 $ TLB.singleton t
+       stringH t = writeText (List.length t) (fromString t)
+       textH   t = writeText (Text.length t) (TLB.fromText t)
+       ltextH  t = writeText (intOfInt64 $ TL.length t) (TLB.fromLazyText t)
        int       = stringH . show
        integer   = stringH . show
        replicate cnt p | cnt <= 0  = empty
index d1726e67f5c201dae079190992ca03195a883c0d..02ebe43c35bafc444f8b333c6c85c74e20745b9c 100644 (file)
@@ -16,10 +16,14 @@ import qualified Data.Text.Lazy as TL
 
 -- * Class 'Doc_Text'
 class (IsString d, Semigroup d) => Doc_Text d where
-       charH     :: Char    -> d -- ^ XXX: MUST NOT be '\n'
-       stringH   :: String  -> d -- ^ XXX: MUST NOT contain '\n'
-       textH     :: Text    -> d -- ^ XXX: MUST NOT contain '\n'
-       ltextH    :: TL.Text -> d -- ^ XXX: MUST NOT contain '\n'
+       charH     :: Char -- ^ XXX: MUST NOT be '\n'
+                 -> d
+       stringH   :: String -- ^ XXX: MUST NOT contain '\n'
+                 -> d
+       textH     :: Text -- ^ XXX: MUST NOT contain '\n'
+                 -> d
+       ltextH    :: TL.Text -- ^ XXX: MUST NOT contain '\n'
+                 -> d
        replicate :: Int -> d -> d
        integer   :: Integer -> d
        default replicate :: Doc_Text (ReprOf d) => Trans d => Int -> d -> d
@@ -38,7 +42,10 @@ class (IsString d, Semigroup d) => Doc_Text d where
        empty       :: d
        newline     :: d
        space       :: d
+       -- | @x '<+>' y = x '<>' 'space' '<>' y@
        (<+>)       :: d -> d -> d
+       -- | @x '</>' y = x '<>' 'newline' '<>' y@
+       (</>)       :: d -> d -> d
        int         :: Int -> d
        char        :: Char    -> d
        string      :: String  -> d
@@ -54,6 +61,7 @@ class (IsString d, Semigroup d) => Doc_Text d where
        newline  = "\n"
        space    = char ' '
        x <+> y  = x <> space <> y
+       x </> y  = x <> newline <> y
        int      = integer . toInteger
        char     = \case '\n' -> newline; c -> charH c
        string   = catV . fmap stringH . L.lines
@@ -62,7 +70,7 @@ class (IsString d, Semigroup d) => Doc_Text d where
        catH     = foldr (<>) empty
        catV     = foldrWith (\x y -> x<>newline<>y)
        foldrWith f ds  = if null ds then empty else foldr1 f ds
-       foldWith  f = foldrWith (\a acc -> a <> f acc)
+       foldWith  f     = foldrWith $ \a acc -> a <> f acc
        intercalate sep = foldrWith (\x y -> x<>sep<>y)
        between o c d = o<>d<>c
        -- default catH :: Doc_Text (ReprOf d) => Trans d => Foldable f => Functor f => f d -> d
@@ -76,20 +84,20 @@ class Doc_Text d => Doc_Align d where
        type Column d = Int
        type Indent d
        type Indent d = Int
-       -- | @align d@, make @d@ uses current 'Column' as 'Indent' level.
+       -- | @('align' d)@ make @d@ uses current 'Column' as 'Indent' level.
        align :: d -> d
-       -- | @hang ind d@, make @d@ uses current 'Column' plus @ind@ as 'Indent' level.
+       -- | @('hang' ind d)@ make @d@ uses current 'Column' plus @ind@ as 'Indent' level.
        hang :: Indent d -> d -> d
        hang ind = align . incrIndent ind
-       -- | @incrIndent ind d@, make @d@ uses current 'Indent' plus @ind@ as 'Indent' level.
+       -- | @('incrIndent' ind d)@ make @d@ uses current 'Indent' plus @ind@ as 'Indent' level.
        incrIndent  :: Indent d -> d -> d
-       -- | @withIndent ind d@, make @d@ uses @ind@ as 'Indent' level.
+       -- | @('withIndent' ind d)@ make @d@ uses @ind@ as 'Indent' level.
        withIndent  :: Indent d -> d -> d
-       -- | @withNewline nl d@, make @d@ uses @nl@ as 'newline'.
+       -- | @('withNewline' nl d)@ make @d@ uses @nl@ as 'newline'.
        withNewline :: d -> d -> d
-       -- | @column f@, return @f@ applied to the current 'Column'.
+       -- | @('column' f)@ returns @f@ applied to the current 'Column'.
        column :: (Column d -> d) -> d
-       -- | @endToEndWidth d f@, return @d@ concatenated to
+       -- | @('endToEndWidth' d f)@ returns @d@ concatenated to
        -- @f@ applied to the difference between the end 'Column' and start 'Column' of @d@.
        --
        -- Note that @f@ is given the end-to-end width,
@@ -101,11 +109,13 @@ class Doc_Text d => Doc_Align d where
        endToEndWidth :: d -> (Column d -> d) -> d
        endToEndWidth d f = column $ \c1 -> (d <>) $ column $ \c2 -> f $ c2 - c1
        
-       -- | @spaces ind@, replicates 'space' @ind@ times.
+       -- | @'spaces' ind = 'replicate' ind 'space'@
        default spaces :: Indent d ~ Int => Indent d -> d
        spaces :: Indent d -> d
        spaces i = replicate i space
        
+       -- | @('fill' ind d)@ returns @d@ then as many 'space's as needed
+       -- so that the whole is @ind@ 'Column's wide.
        default fill ::
         Indent d ~ Int =>
         Column d ~ Int =>
@@ -117,47 +127,61 @@ class Doc_Text d => Doc_Align d where
                         LT -> spaces $ m - w
                         _  -> empty
        
+       -- | @('breakableFill' ind f d)@ returns @f@ then as many 'space's as needed
+       -- so that the whole is @ind@ 'Column's wide,
+       -- then, if @f@ is not wider than @ind@, appends @d@,
+       -- otherwise appends a 'newline' and @d@,
+       -- with an 'Indent' level set to the start 'Column' of @f@ plus @ind@.
        default breakableFill ::
         Indent d ~ Int =>
         Column d ~ Int =>
-        Indent d -> d -> d
-       breakableFill :: Indent d -> d -> d
-       breakableFill m d =
-               endToEndWidth d $ \w ->
+        Indent d -> d -> d -> d
+       breakableFill :: Indent d -> d -> d -> d
+       breakableFill m f d =
+               column $ \c ->
+               endToEndWidth f $ \w ->
                        case w`compare`m of
-                        LT -> spaces $ m - w
-                        EQ -> empty
-                        GT -> incrIndent m newline
+                        LT -> spaces (m - w) <> d
+                        EQ -> d
+                        GT -> withIndent (c + m) (newline <> d)
 
 -- * Class 'Doc_Wrap'
 class (Doc_Text d, Doc_Align d) => Doc_Wrap d where
-       -- | @ifFit onFit onNoFit@,
+       -- | @('ifFit' onFit onNoFit)@
        -- return @onFit@ if @onFit@ leads to a 'Column'
        -- lower or equal to the one sets with 'withWrapColumn',
        -- otherwise return @onNoFit@.
        ifFit :: d -> d -> d
-       -- | @breakpoint onNoBreak onBreak d@,
+       -- | @('breakpoint' onNoBreak onBreak d)@
        -- return @onNoBreak@ then @d@ if they fit,
        -- @onBreak@ otherwise.
        breakpoint :: d -> d -> d -> d
-       -- | @breakableEmpty d@, return @d@ if it fits, 'newline' then @d@ otherwise.
+       -- | @('breakableEmpty' d)@ returns @d@ if it fits, 'newline' then @d@ otherwise.
        breakableEmpty :: d -> d
        breakableEmpty = breakpoint empty newline
-       -- | @breakableSpace d@, return 'space' then @d@ it they fit, 'newline' then @d@ otherwise.
+       -- | @x '><' y = x '<>' 'breakableEmpty' y@
+       (><) :: d -> d -> d
+       x >< y = x <> breakableEmpty y
+       -- | @('breakableSpace' d)@ returns 'space' then @d@ it they fit,
+       -- 'newline' then @d@ otherwise.
        breakableSpace :: d -> d
        breakableSpace = breakpoint space newline
-       -- | @breakableSpaces ds@ intercalate a 'breakableSpace' between items of @ds@.
+       -- | @x '>+<' y = x '<>' 'breakableSpace' y@
+       (>+<) :: d -> d -> d
+       x >+< y = x <> breakableSpace y
+       -- | @'breakableSpaces' ds@ intercalate a 'breakableSpace'
+       -- between items of @ds@.
        breakableSpaces :: Foldable f => f d -> d
        breakableSpaces = foldWith breakableSpace
-       -- | @withWrapColumn col d@ set the 'Column' triggering wrapping to @col@ within @d@.
+       -- | @'withWrapColumn' col d@ set the 'Column' triggering wrapping to @col@ within @d@.
        withWrapColumn :: Column d -> d -> d
-       -- | @intercalateHorV sep ds@,
+       -- | @('intercalateHorV' sep ds)@
        -- return @ds@ with @sep@ intercalated if the whole fits,
        -- otherwise return 'align' of @ds@ with 'newline' and @sep@ intercalated.
        intercalateHorV :: Foldable f => d -> f d -> d
        intercalateHorV sep xs =
-               ifFit    (foldr1 (\a acc -> a <> sep            <> acc) xs)
-                (align $ foldr1 (\a acc -> a <> newline <> sep <> acc) xs)
+               ifFit (foldWith (sep <>) xs)
+                (align $ foldWith ((newline <> sep) <>) xs)
 
 -- * Class 'Doc_Color'
 class Doc_Color d where
index e69b7f404008f3349380326c764d557d92b78465..bb4209c0296a6b1bb592ff90952eacb2e9e51956 100644 (file)
@@ -58,6 +58,7 @@ instance Monad Valid where
 instance (Doc_Text repr, Semigroup repr) => Doc_Text (Valid repr) where
        replicate i _ | i < 0 = KO [Error_Valid_negative_replicate i]
        replicate i d         = d >>= Ok . replicate i
+       empty     = pure empty
        int       = pure . int
        integer   = pure . integer
        char      = pure . char
index 5aad25efa727295bc7c21039c9172c5404ec9d3a..606bd29d450b0e96f22725394d5597644bbf3d13 100644 (file)
@@ -68,11 +68,15 @@ hunitsPlain = testGroup "Plain"
                           , ("abcdefghi","Doc") ])
      ==> "let abcdef :: Doc\n    abcde  :: Int -> Doc -> Doc\n    abcdefghi :: Doc"
    , "let " <> Doc.align (Doc.catV $
-               (\(name, typ) -> Doc.breakableFill 6 (Doc.stringH name) <+> "::" <+> Doc.stringH typ)
+               (\(name, typ) -> Doc.breakableFill 6 (Doc.stringH name) $ " ::" <+> Doc.stringH typ)
                `List.map` [ ("abcdef","Doc")
                           , ("abcde","Int -> Doc -> Doc")
                           , ("abcdefghi","Doc") ])
      ==> "let abcdef :: Doc\n    abcde  :: Int -> Doc -> Doc\n    abcdefghi\n           :: Doc"
+   , "let " <> Doc.align (Doc.catV $
+               (\(name, typ) -> Doc.breakableFill 6 (Doc.stringH name) $ " ::" <+> typ)
+               `List.map` [("abcdefghi","Doc ->\nDoc")])
+     ==> "let abcdefghi\n           :: Doc ->\n          Doc"
    ]
  , testList "Doc_Wrap"
    [ 10`wc` be ["hello", "world"] ==> "helloworld"