(loop []
(do something)
(when c
(recur)))
do_while(Block, C) ->
case C(Block()) of
true -> do_while(Block, C);
false -> ok
end.
doowhile c b = do a <- b; if c a then doowhile c b else return a doowhile (=="") getLine gg
loop stuff(); if not c then exit; end if; end loop;
do { someThing(); someOtherThing(); } while(c);
do { stuff() } while ( c ) ;
(loop [] (do something) (when c (recur)))
IDENTIFICATION DIVISION. PROGRAM-ID. "do while" loop. DATA DIVISION. WORKING-STORAGE SECTION. 01 boolean-c PIC x. 88 c-true PIC x VALUE 't'. 88 c-false PIC x VALUE 'f'. PROCEDURE DIVISION. PERFORM WITH TEST AFTER UNTIL c-false PERFORM somthing END-PERFORM STOP RUN.
do { someThing(); someOtherThing(); } while(c);
do { stuff(); } while(c);
do { something; somethingElse; } while (c);
do { someThing(); someOtherThing(); } while(c);
def main(condition) do case condition do true -> main(condition) false -> nil end end
do_while(Block, C) -> case C(Block()) of true -> do_while(Block, C); false -> ok end.
do call do_something if (.not. c) exit end do
for{ someThing() someOtherThing() if !c { break } }
for done := false; !done; { someThing() someOtherThing() done = !c() }
do { something(); } while (c);
do { someThing(); someOtherThing(); } while(c);
do f(); while (c);
(loop do (something) while c)
repeat someThing() someOtherThing() until not c
do ... while(c);
do { echo '.'; } while ($c);
repeat Something; SomethingElse; until not c;
repeat Something; SomethingElse; until c;
do { doSomeStuff(); } while(c);
while True: do_something() if not c: break
x = True while x: x = c
begin # code end while c
while { doStuff(); c } { /* EMPTY */ }
loop { doStuff(); if !c { break; } }
do { someThing() someOtherThing() } while (c)
[ " do something " c ] whileTrue: [].
Do SomeThing() SomeOtherThing() Loop While c