from operator import itemgetter import socket import prolog.engine import prolog.util from server.hints import Hint, HintPopup id = 176 number = 10 visible = True facts = None solution = '''\ algol(fun(S0,S,apply176([printout=[]|S0],S,Minstructs))) --> [begin], instructs176(Minstructs), [end]. instructs176(Minstr) --> instr176(Minstr). instructs176(fun(S0,S, (apply176(S0,S1,Minstr), apply176(S1,S,Minstructs)))) --> instr176(Minstr), instructs176(Minstructs). instr176(Massign) --> assign176(Massign). instr176(fun(S0,[printout = L1|S1], (memb(X = V,S0), del(printout = L0,S0,S1), conc(L0,[V],L1)))) --> [print(X)]. instr176(fun(S0,S, loop176(S0,Mcond,Minstructs,S))) --> [while], cond176(Mcond), [do,begin], instructs176(Minstructs), [end]. assign176(fun(S0,[X = Value|S1], (apply176(S0,Value,Mexpr), del(X = _,S0,S1)))) --> var176(X), [:=], expr176(Mexpr). cond176( fun( S, TruthVal, (apply176(S,Val1,ME1), apply176(S,Val2,ME2), (Val1 < Val2,!,TruthVal = true ; TruthVal = false)))) --> expr176(ME1), [<], expr176(ME2). var176(X) --> [X], {atom(X)}. expr176(fun(S,Value,eval(Expr,S,Value))) --> [Expr]. apply176(In, Out, fun(In, Out, Goals)) :- call(Goals). loop176(State0, Mcond, _, State0) :- apply176( State0, false, Mcond), !. loop176(S0, Mcond, MBody, S) :- copy_term( MBody, MBodyCopy), apply176( S0, S1, MBody), loop176( S1, Mcond, MBodyCopy, S). eval176(N, _, N) :- number176( N), !. eval176(X, State, Val) :- % A program variable atom(X), !, memb(X = Val, State). eval176(E1 + E2, State, Val) :- !, eval176(E1, State, V1), eval176(E2, State, V2), Val is V1 + V2. eval176(E1 - E2, State, Val) :- !, eval176(E1, State, V1), eval176(E2, State, V2), Val is V1 - V2. eval176(E1 * E2, State, Val) :- !, eval176(E1, State, V1), eval176(E2, State, V2), Val is V1 * V2. eval176(E1 / E2, State, Val) :- !, eval176(E1, State, V1), eval176(E2, State, V2), Val is V1 / V2. ''' initial = '''\ % program algol(fun(S0, S, apply([printout=[]|S0], S, Minstructs))) --> [begin], instructs(Minstructs), [end]. % sequence of instructions instructs(Minstr) --> instr(Minstr). instructs(fun(S0,S, (apply(S0,S1,Minstr), apply(S1,S,Minstructs)))) --> instr(Minstr), instructs(Minstructs). % statement (instruction) instr(Massign) --> assign(Massign). % put the current value of a variable into the output list instr(fun(S0, [printout = L1|S1], (memb(X = V,S0), del(printout = L0, S0, S1), conc(L0, [V], L1)))) --> [print(X)]. % while-loop instr(fun(S0, S, loop(S0, Mcond, Minstructs, S))) --> [while], cond(Mcond), [do, begin], instructs(Minstructs), [end]. % assignment statement assign(fun(S0, [X = Value|S1], (apply(S0, Value, Mexpr), del(X = _, S0, S1)))) --> var(X), [':='], expr(Mexpr). % conditional expression cond(fun(S, TruthVal, (apply(S, Val1, ME1), apply(S, Val2, ME2), (Val1 < Val2, !, TruthVal = true ; TruthVal = false)))) --> expr(ME1), ['<'], expr(ME2). % variable var(X) --> [X], { atom(X) }. % expression expr(fun(S, Value, eval(Expr, S, Value))) --> [Expr]. % Expr is a Prolog arithmetic expression, e.g. x + 2*y + 3 % helper predicates % function call apply(In, Out, fun(In, Out, Goals)):- call(Goals). % loop loop(State0, Mcond, _, State0) :- apply(State0, false, Mcond), !. % condition is false loop(S0, Mcond, MBody, S) :- copy_term(MBody, MBodyCopy), % copy goals apply(S0, S1, MBody), % run loop body loop(S1, Mcond, MBodyCopy, S). % next iteration % expression evaluation eval(N, _, N) :- number(N), !. eval(X, State, Val) :- % a program variable atom(X), !, memb(X = Val, State). eval(E1 + E2, State, Val) :- !, eval(E1, State, V1), eval(E2, State, V2), Val is V1 + V2. eval(E1 - E2, State, Val) :- !, eval(E1, State, V1), eval(E2, State, V2), Val is V1 - V2. eval(E1 * E2, State, Val) :- !, eval(E1, State, V1), eval(E2, State, V2), Val is V1 * V2. eval(E1 / E2, State, Val) :- !, eval(E1, State, V1), eval(E2, State, V2), Val is V1 / V2. ''' test_cases = [ ('findall(W, (W = [_], algol(_, W, [])), Words), Words == []', [{}]), ('algol(F, [begin,a,:=,a+2,end], []), apply([a=3], Out, F), msort(Out, OutSorted), OutSorted == [a=5,printout=[]]', [{}]), ] def test(code, aux_code): n_correct = 0 engine_id = None try: engine_id, output = prolog.engine.create(code=code+aux_code, timeout=1.0) if engine_id is not None and 'error' not in map(itemgetter(0), output): # Engine successfully created, and no syntax error in program. for query, answers in test_cases: if prolog.engine.check_answers(engine_id, query=query, answers=answers, timeout=1.0): n_correct += 1 except socket.timeout: pass finally: if engine_id: prolog.engine.destroy(engine_id) hints = [{'id': 'test_results', 'args': {'passed': n_correct, 'total': len(test_cases)}}] return n_correct, len(test_cases), hints