~rdoering/ubuntu/karmic/erlang/fix-535090

« back to all changes in this revision

Viewing changes to lib/stdlib/src/file_sorter.erl

  • Committer: Bazaar Package Importer
  • Author(s): Sergei Golovan
  • Date: 2009-02-15 16:42:52 UTC
  • mfrom: (1.1.13 upstream)
  • mto: (3.3.1 squeeze)
  • mto: This revision was merged to the branch mainline in revision 17.
  • Revision ID: james.westby@ubuntu.com-20090215164252-dxpjjuq108nz4noa
Upload to unstable after lenny is released.

Show diffs side-by-side

added added

removed removed

Lines of Context:
264
264
                  Fn = merge_terms_fun(file_rterms(no_file, [File])),
265
265
                  {fn, Fn, File}
266
266
          end,
267
 
    {binary_term_fun(), lists:map(Fun, Files)};
 
267
    {binary_term_fun(), [Fun(F) || F <- Files]};
268
268
wrap_input(Format, check, Files) ->
269
269
    {Format, Files};
270
270
wrap_input(term, merge, Files) ->
271
271
    Fun = fun(File) -> merge_terms_fun(file_rterms(no_file, [File])) end,
272
 
    Input = lists:reverse(lists:map(Fun, Files)),
 
272
    Input = lists:reverse([Fun(F) || F <- Files]),
273
273
    {binary_term_fun(), Input};
274
274
wrap_input(Format, merge, Files) ->
275
 
    Input = lists:reverse(lists:map(fun merge_bins_fun/1, Files)),
 
275
    Input = lists:reverse([merge_bins_fun(F) || F <- Files]),
276
276
    {Format, Input};
277
 
wrap_input(term, sort, InFun) when is_function(InFun), is_function(InFun, 1) ->
 
277
wrap_input(term, sort, InFun) when is_function(InFun, 1) ->
278
278
    {binary_term_fun(), fun_rterms(InFun)};
279
279
wrap_input(term, sort, Files) ->
280
280
    {binary_term_fun(), file_rterms(no_file, Files)};