=== source code for shell_SUITE:otp_6554/1
=== Test case started with:
shell_SUITE:otp_6554([{watchdog,<0.7705.6>},
{tc_logfile,"/home/pi/R16B03/otp-support/release/tests/test_server/ct_run.test_server@localhost.2014-01-03_17.38.00/tests.stdlib_test.logs/run.2014-01-03_17.51.25/shell_suite.otp_6554.html"},
{tc_group_properties,[{name,tickets}]},
{tc_group_path,[]},
{data_dir,"/home/pi/R16B03/otp-support/release/tests/stdlib_test/shell_SUITE_data/"},
{priv_dir,"/home/pi/R16B03/otp-support/release/tests/test_server/ct_run.test_server@localhost.2014-01-03_17.38.00/tests.stdlib_test.logs/run.2014-01-03_17.51.25/log_private/"},
{nodenames,[]}])
=== Current directory is "/home/pi/R16B03/otp-support/release/tests/test_server/ct_run.test_server@localhost.2014-01-03_17.38.00"
=== Started at 2014-01-03 20:21:09
*** Testing math:sqrt(a).
*** Testing fun(X, Y) -> X ++ Y end(a, b).
*** Testing math:sqrt(lists:seq(1,40)).
*** Testing math:sqrt(lists:seq(1,10)).
*** Testing a ++ b.
*** Testing I = {file_info,undefined,undefined,undefined,undefined,
undefined,undefined,undefined,undefined,undefined,
undefined,undefined,undefined,undefined},
aa ++ I.
*** Testing I = {file_info,undefined,undefined,undefined,undefined,
undefined,undefined,undefined,undefined,undefined,
undefined,undefined,undefined,undefined},
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa ++ I.
*** Testing I = {file_info,undefined,undefined,undefined,undefined,
undefined,undefined,undefined,undefined,undefined,
undefined,undefined,undefined,undefined},
I ++ I.
*** Testing fun(X) -> not X end(a).
*** Testing fun(A, B) -> A orelse B end(a, b).
*** Testing math:sqrt(2)/round(math:sqrt(0)).
*** Testing fun(V) -> V end().
*** Testing fun(V) -> V end(1,2).
*** Testing fun() -> v end(1).
*** Testing fun() -> v end(1,2,3,4).
*** Testing fun math:sqrt/1(1,2).
*** Testing (math:sqrt(2))().
*** Testing (lists:seq(1, 100))().
*** Testing a = math:sqrt(2).
*** Testing I = {file_info,undefined,undefined,undefined,undefined,
undefined,undefined,undefined,undefined,undefined,
undefined,undefined,undefined,undefined},
a = I.
*** Testing case math:sqrt(2) of a -> ok end.
*** Testing V = lists:seq(1, 20), case V of a -> ok end.
*** Testing fun(P) when is_pid(P) -> true end(a).
*** Testing erlang:error(function_clause, [unproper | list]).
*** Testing erlang:error(function_clause, [4]).
*** Testing F=fun() -> hello end, lists:reverse(F).
*** Testing lists:reverse(34).
*** Testing erlang:error(function_clause, 4).
*** Testing fun(a, b, c, d) -> foo end (lists:seq(1,17), lists:seq(1, 18), lists:seq(1, 40), lists:seq(1, 5)).
*** Testing fun(P, q) when is_pid(P) -> true end(a, b).
*** Testing if length([a,b]) > 17 -> a end.
*** Testing Pid = spawn(fun() -> a end),timer:sleep(1),link(Pid).
*** Testing list_to_atom(lists:duplicate(300,$a)).
*** Testing receive after a -> foo end.
*** Testing try math:sqrt(2) of bar -> yes after 3 end.
*** Testing V = lists:seq(1, 20),try V of bar -> yes after 3 end.
*** Testing math:sqrt(2, 2).
*** Testing fun(A,B,C,D,E,F,G,H,I,J,K,L,M,N,O,P,Q,R,S,T,U) -> a end().
*** Testing [b || begin a end].
*** Testing [X || X <- a].
*** Testing throw(undef).
*** Testing exit(undef).
*** Testing catch spawn_link(fun() -> timer:sleep(300), exit(foo) end),timer:sleep(500).
*** Testing begin process_flag(trap_exit, true), Pid = spawn_link(fun() -> timer:sleep(300), exit(foo) end), timer:sleep(500), receive {'EXIT', Pid, foo} -> ok end end.
*** Testing catch spawn_link(fun() -> timer:sleep(300), 1/0 end),timer:sleep(500).
*** System report during shell_SUITE:otp_6554/1 in tickets 2014-01-03 20:21:12.737 ***
=ERROR REPORT==== 3-Jan-2014::20:21:12 ===
Error in process <0.8002.6> on node 'test_server@localhost' with exit value: {badarith,[{erlang,'/',[1,0],[]}]}
*** Testing catch spawn_link(fun() -> timer:sleep(300), throw(foo) end),timer:sleep(500).
*** System report during shell_SUITE:otp_6554/1 in tickets 2014-01-03 20:21:13.090 ***
=ERROR REPORT==== 3-Jan-2014::20:21:13 ===
Error in process <0.8010.6> on node 'test_server@localhost' with exit value: {{nocatch,foo},[{erlang,apply,2,[]}]}
*** Testing begin process_flag(trap_exit, true), Pid = spawn_link(fun() -> timer:sleep(300), throw(foo) end), timer:sleep(500), receive {'EXIT', Pid, {{nocatch,foo},_}} -> ok end end.
*** System report during shell_SUITE:otp_6554/1 in tickets 2014-01-03 20:21:13.445 ***
=ERROR REPORT==== 3-Jan-2014::20:21:13 ===
Error in process <0.8018.6> on node 'test_server@localhost' with exit value: {{nocatch,foo},[{erlang,apply,2,[]}]}
*** Testing begin catch_exception(true), 1/0 end.
*** Testing begin catch_exception(false), 1/0 end.
*** Testing catch_exception(1).
*** Testing try 1 of 1 -> v(2) after 3 end.
*** Testing receive foo -> foo after 0 -> v(3) end.
*** Testing receive foo -> foo after 0 -> e(3) end.
*** Testing v(1/0).
*** Testing 1. e(1).
*** Testing h().
*** Testing exit(normal).
*** Testing begin history(0), foo end.
*** Testing begin <<10:(1024*1024*10)>>,<<10:(1024*1024*10)>>, garbage_collect() end.
*** Testing 1-.
*** Testing history(foo).
*** Testing results(foo).
*** Testing begin shell:start_restricted(otp_6554) end.
*** Testing f(), f(B), h(), b(), history(20), results(20),rd(r, {}), rl(r), rf('_'), rl(), rf(),rp(1), _ = rr({foo}), _ = rr({foo}, []),rr({foo}, [], []), ok.
*** Testing catch_exception(true).
*** Testing begin shell:stop_restricted() end.
*** Testing catch_exception(false).
*** Testing results(2). 1. v(2). h().
*** Testing begin F = fun() -> foo end, 1 end. B = F(). C = 17. b().
=== Ended at 2014-01-03 20:21:14
=== successfully completed test case
=== returned value = ok
Test run history
| Top level test index