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

« back to all changes in this revision

Viewing changes to lib/stdlib/src/io.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:
356
356
                Request0
357
357
        end,
358
358
    Request;
359
 
io_request(Pid, {get_chars,Prompt,N}) when node(Pid) =/= node() ->
360
 
    %% Do not send new I/O request to possibly old I/O server
361
 
    {get_until,Prompt,io_lib,collect_chars,[N]};
362
 
io_request(Pid, {get_line,Prompt}) when node(Pid) =/= node() ->
363
 
    %% Do not send new I/O request to possibly old I/O server
364
 
    {get_until,Prompt,io_lib,collect_line,[]};
365
359
io_request(_Pid, {fread,Prompt,Format}) ->
366
360
    {get_until,Prompt,io_lib,fread,[Format]};
367
361
io_request(_Pid, R) ->                          %Pass this straight through