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

« back to all changes in this revision

Viewing changes to lib/stdlib/src/gen_server.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:
110
110
%%%  API
111
111
%%%=========================================================================
112
112
 
 
113
-spec behaviour_info(atom()) -> 'undefined' | [{atom(), byte()}].
 
114
 
113
115
behaviour_info(callbacks) ->
114
116
    [{init,1},{handle_call,3},{handle_cast,2},{handle_info,2},
115
117
     {terminate,2},{code_change,3}];
628
630
system_continue(Parent, Debug, [Name, State, Mod, Time]) ->
629
631
    loop(Parent, Name, State, Mod, Time, Debug).
630
632
 
631
 
-spec(system_terminate/4 :: (_, _, _, [_]) -> no_return()).
 
633
-spec system_terminate(_, _, _, [_]) -> no_return().
632
634
 
633
635
system_terminate(Reason, _Parent, Debug, [Name, State, Mod, _Time]) ->
634
636
    terminate(Reason, Name, [], Mod, State, Debug).