Logo

Programming-Idioms

  • Erlang
  • Cobol

Idiom #96 Check string prefix

Set the boolean b to true if string s starts with prefix prefix, false otherwise.

Are the first characters of s equal to this prefix?
IDENTIFICATION DIVISION.
PROGRAM-ID. prefix.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 BOOLEAN-B     PIC X.
   88 b-TRUE       VALUE "T".
   88 b-FALSE      VALUE "F".
PROCEDURE DIVISION.
    IF s(1:3) = prefix(1:3)
       SET b-TRUE  TO TRUE
    ELSE
       SET b-FALSE TO TRUE
    END-IF 	 	
STOP RUN.

Is this limited to the first 3 letters?
B = string:find(S, Prefix) =:= S.
prefix([], _) -> true;
prefix([Ch | Rest1], [Ch | Rest2]) ->
        prefix(Rest1, Rest2);
prefix(_, _) -> false.

prefix("abc", "abcdef").
with Ada.Strings.Fixed;
B := Ada.Strings.Fixed.Index (S, Prefix) = S'First;

New implementation...