Note that the not-yet-changelogged warnings also include tags (should
be easy to fix).

Please help write ChangeLog entries! Only 264 patches left!

Fri Jun 13 15:25:40 BST 2008  Eric Kow <[EMAIL PROTECTED]>
  * Add ability to ignore patches for ChangeLog.
  This would be useful if make_changelog could point out which patches
  are not being changelogged.

Fri Jun 13 15:54:43 BST 2008  Eric Kow <[EMAIL PROTECTED]>
  * Resolve issue705: warn about patches which are not changelogged.
  Mostly by Tommy Pettersson.

Fri Jun 13 16:06:20 BST 2008  Eric Kow <[EMAIL PROTECTED]>
  * Add 'ignored' changelog entries (no warnings).

Fri Jun 13 16:12:00 BST 2008  Eric Kow <[EMAIL PROTECTED]>
  * ChangeLog entries by Eric.
  Some ChangeLog entries for 2.0.1

New patches:

[Add ability to ignore patches for ChangeLog.
Eric Kow <[EMAIL PROTECTED]>**20080613142540
 This would be useful if make_changelog could point out which patches
 are not being changelogged.
] hunk ./src/make_changelog.hs 31
 import Darcs.Sealed ( liftSM )
 
 import Data.Char ( isSpace )
-import Data.Maybe ( catMaybes )
+import Data.Maybe ( catMaybes, mapMaybe )
 import Data.List ( intersperse, unfoldr )
 
 import Text.ParserCombinators.Parsec
hunk ./src/make_changelog.hs 42
 import System.Locale ( defaultTimeLocale, rfc822DateFormat )
 import System.IO (hPutStr, stderr)
 
-type ChangeLogEntry p = ([Matcher p], Doc)
+type ChangeLogEntry p = ([Matcher p], Maybe Doc)
 
 main :: IO ()
 main = withRepository [] $- \repository -> do
hunk ./src/make_changelog.hs 65
     when (not (null unmatched)) $ do
         hPutStr stderr $ concat
             [ "\nunmatched ChangeLog entries (upcoming?):\n\n"
-            , renderDocs (map snd unmatched)
+            , renderDocs (mapMaybe snd unmatched)
             ]
   where
     processPatch entries patch = do
hunk ./src/make_changelog.hs 74
             let patterns' = filter (not . (`apply_matcher` patch)) patterns
             if null patterns'
               then do
-                tell [descr]
+                case descr of
+                 Nothing -> return ()
+                 Just d  -> tell [d]
                 return Nothing
               else do
                 return (Just (patterns', descr))
hunk ./src/make_changelog.hs 156
    padding p = text . take p . repeat $ ' '
 
 entry :: CharParser st (ChangeLogEntry p)
-entry = do
+entry = matchEntry <|> ignoreEntry
+
+ignoreEntry :: CharParser st (ChangeLogEntry p)
+ignoreEntry = do
+    emptyLine
+    patterns <- many1 $ do
+        try (string "ignore:")
+        startPos <- getPosition
+        -- take the characters to the end of line
+        s <- restOfLine
+        endState <- getParserState
+        -- and parse them again as a match pattern
+        setPosition startPos
+        setInput s
+        m <- match_parser
+        -- restore parser state
+        setParserState endState
+        newline
+        return (make_matcher s m)
+    return (patterns, Nothing)
+
+matchEntry :: CharParser st (ChangeLogEntry p)
+matchEntry = do
     emptyLine
     patterns <- many1 $ do
         try (string "match:")
hunk ./src/make_changelog.hs 202
         newline
         return cs
     emptyLine
-    return (patterns, formatEntry descr)
+    return (patterns, Just $ formatEntry descr)
 
 emptyLine :: CharParser st ()
 emptyLine = skipMany $ do optional (char '#' >> restOfLine)
[Resolve issue705: warn about patches which are not changelogged.
Eric Kow <[EMAIL PROTECTED]>**20080613145443
 Mostly by Tommy Pettersson.
] hunk ./src/make_changelog.hs 25
 import Darcs.Patch.Match ( match_parser, match_pattern, apply_matcher, Matcher,
                     make_matcher )
 import Darcs.Patch.MatchData ( PatchMatch(..) )
-import Darcs.Patch.Info ( PatchInfo, just_name, just_author, pi_date )
+import Darcs.Patch.Info ( PatchInfo, just_name, just_author, pi_date, human_friendly )
 import Darcs.Patch.Ordered ( unsafeUnRL, concatRL )
 import Darcs.Hopefully ( info )
 import Darcs.Sealed ( liftSM )
hunk ./src/make_changelog.hs 67
             [ "\nunmatched ChangeLog entries (upcoming?):\n\n"
             , renderDocs (mapMaybe snd unmatched)
             ]
+
+    let unlogged = filter (\p -> not $ any (`apply_matcher` p) allpatterns) history
+         where allpatterns = concat $ map fst entries
+    hPutStr stderr $ concat
+           [ "\npatches which have not yet been changelogged\n\n"
+           , renderDocs $ map (human_friendly.info) unlogged
+           ]
+
   where
     processPatch entries patch = do
         let pinfo = info patch
hunk ./src/make_changelog.hs 183
         setParserState endState
         newline
         return (make_matcher s m)
+    emptyLine
     return (patterns, Nothing)
 
 matchEntry :: CharParser st (ChangeLogEntry p)
[Add 'ignored' changelog entries (no warnings).
Eric Kow <[EMAIL PROTECTED]>**20080613150620] addfile ./changelog.in/entries/ignored
hunk ./changelog.in/entries/ignored 1
+ignore: date "before 2008-04-07 15:06:38Z"
+
+ignore: name "typo"
+
+ignore: name "Canonize"
+
[ChangeLog entries by Eric.
Eric Kow <[EMAIL PROTECTED]>**20080613151200
 Some ChangeLog entries for 2.0.1
] addfile ./changelog.in/entries/kowey
hunk ./changelog.in/entries/kowey 1
+ignore: exact "Replace presumably non-portable use of fgrep in issue864 bug"
+ignore: exact "Fix import warnings for Windows"
+ignore: exact "eliminate duplicate get_remote_repo in favor of list comprehensions."
+ignore: exact "fix up website for new release."
+
+match: exact "add --count output option to changes."
+> New Feature: darcs changes --count (David Roundy)
+
+match: exact "Add test for case-insensitive backup bug."
+match: exact "Fix a backup bug on case-insensitive file systems."
+> Bug Fix: Avoid a error caused by renaming a file on
+> case-insensitive file-systems (Eric Kow)
+
+match: exact "Check for bash before running shell tests."
+> Internal: Improvements running test suite on Windows (David
+> Roundy, Eric Kow)
+
+match: exact "Resolve issue913: Use Data.Bytestring for IO, not Data.Bytestring.Char8"
+match: exact "rearrange bytestring tests so if it's not present we're quieter."
+match: exact "configure.ac: fix bytestring checking"
+match: name  "^FastPackedString\.hs:"
+match: exact "just remove concatLenPS"
+> Performance: Faster strings, using Data.Bytestring
+> by default (Gwern Branwen, Eric Kow, Ian Lynagh, David Roundy)
+
+match: exact "simplify determine_release_state.pl."
+match: exact "make determine_release_state.pl use changes --count."
+match: exact "automatically work out the version of the stable release."
+> New Feature: Include patch count in darcs --version, for
+> example darcs 2.0.1 (2.0.1 + 32 patches) (David Roundy)
+
+match: exact "resolve issue795: Make 'darcs changes -i' behave more like other jobs."
+match: exact "Undo a false refactor in SelectChanges."
+match: exact "Correct changes -i help message."
+match: exact "resolve issue827: correct changes -i behaviour"
+> User Experience: Make darcs changes --interactive behave more like
+> other interactive commands (Eric Kow)
+
+match: exact "optimized get --to-match handling for darcs 1 repositories"
+> Performance: optimized get --to-match handling for darcs 1
+> repositories (Reinier Lamers)
+
+match: exact "Replace colour by color to uniformise a bit."
+match: exact "Rename ColourPrinter to ColorPrinter."
+> Internal: Standardize code and comments on American spelling
+> (Nicolas Pouillard, Eric Kow)
+
+match: exact "default to not coloring hunks."
+match: exact "Use the lineColoring to prettify hunks with colors."
+match: exact "Add line coloring support in Printer and ColourPrinter."
+match: exact "Export Printer.(<?>)."
+match: exact "Add two colors (cyan and magenta), but not use them yet."
+match: exact "Refactor a little the color handling."
+> User Experience: Colorize added and removed lines, if the
+> environment variable DARCS_DO_COLOR_LINES=True (Nicolas Pouillard)
+
+match: exact "resolve issue385: don't worry if we can't get local changes."
+match: exact "add test for issue385."
+> Bug Fix: Make changes --repo work when not in a repository (David
+> Roundy)
+
+match: exact "Zapped bash-ism from configure.ac."
+match: exact "Not using awk in configure.ac"
+> Internal: Improved configure/make portability (Pekka Pessi)
+
+match: exact "doc updates"
+match: exact "remove git section from building_darcs.tex"
+match: exact "doc: tell users about darcs-2 handling of identical patches."
+match: exact "doc: encourage new users to use --darcs-2 repositories."
+match: exact "resolve issue76: update docs on temp directory creation."
+match: exact "doc: msmtp -t (for multiple recipients)"
+match: exact "doc tweak"
+match: exact "doc: darcs-2 is no longer experimental."
+match: exact "resolve issue809: doc: darcs get is not lazy by default."
+> Quality Assurance: Various improments to documentation
+> (issue76, issue809, Gwern Branwen, Eric Kow, Nicolas Pouillard,
+> David Roundy)

Context:

[TAG 2.0.1rc2
David Roundy <[EMAIL PROTECTED]>**20080613011745] 
[bump version number up to 2.0.1rc2.
David Roundy <[EMAIL PROTECTED]>**20080613011731] 
[Resolve issue913: Use Data.Bytestring for IO, not Data.Bytestring.Char8
Eric Kow <[EMAIL PROTECTED]>**20080612125719
 
 This solution comes from Ian Lynagh, who points out that the
 difference between the two is:
 
 Data.Bytestring.Char8
 ---------------------
 writeFile :: FilePath -> ByteString -> IO ()
 writeFile f txt = bracket (openFile f WriteMode) hClose
    (\h -> hPut h txt)
 
 Data.Bytestring
 ---------------
 writeFile :: FilePath -> ByteString -> IO ()
 writeFile f txt = bracket (openBinaryFile f WriteMode) hClose
    (\h -> hPut h txt)
 
 We want this change because, as the System.IO docs say:
 
   On Windows, reading a file in text mode (which is the default) will
   translate CRLF to LF, and writing will translate LF to CRLF. This is
   usually what you want with text files. With binary files this is
   undesirable; also, as usual under Microsoft operating systems, text
   mode treats control-Z as EOF. Binary mode turns off all special
   treatment of end-of-line and end-of-file characters.
 
] 
[fix OPTLLIBS filtering
Karel Gardas <[EMAIL PROTECTED]>**20080607210701] 
[Darcs.Repository.Prefs: +boring filters for MS Visual Studio (see -users discussion)
[EMAIL PROTECTED] 
[Demonstrate 'hidden conflicts' bug (old format).
Eric Kow <[EMAIL PROTECTED]>**20080606151534] 
[fix regression introduced by using Data.List.isInfixOf.
David Roundy <[EMAIL PROTECTED]>**20080606102519] 
[fix bug in test when there's a space in test directory.
David Roundy <[EMAIL PROTECTED]>**20080605151104] 
[translate pull.pl into shell.
David Roundy <[EMAIL PROTECTED]>**20080605124106] 
[make test suite smarter about cleaning up test directories.
David Roundy <[EMAIL PROTECTED]>**20080605124025] 
[darcs put now support --{no-,}set-default.
Nicolas Pouillard <[EMAIL PROTECTED]>**20080604214551] 
[fix regression in index.html.in.
David Roundy <[EMAIL PROTECTED]>**20080605114356] 
[resolve issue783: propose 'edit' as a default Windows editor
Eric Kow <[EMAIL PROTECTED]>**20080605165812
 
 I think every Windows box has this.  Advantages over notepad are that
 - it's a console app
 - it appears to support Unix newlines
] 
[Makefile: prefix -optl only on $(LIBS) that start with '-'
Eric Kow <[EMAIL PROTECTED]>**20080605105539
 
 Otherwise, on Windows, if you try to build --with-static-libs, the
 linker will be passed /usr/local/lib/libcurl.a as an argument, which
 makes gcc complain.
] 
[resolve issue770: catch 'does not exist' when running external programs
Eric Kow <[EMAIL PROTECTED]>**20080604143100
 Convert these errors into ExitCode 127 (for Windows)
] 
[TAG 2.0.1rc1
David Roundy <[EMAIL PROTECTED]>**20080603124331] 
Patch bundle hash:
523315d5830b80b7faa61db5fffd6f2125aafbe1
_______________________________________________
darcs-users mailing list
[email protected]
http://lists.osuosl.org/mailman/listinfo/darcs-users

Reply via email to