From 4d542bc7eafadb16b845cf05d1eb4988eb55ed0f Mon Sep 17 00:00:00 2001 From: Bernhard Schommer Date: Tue, 20 Oct 2015 13:32:18 +0200 Subject: Updated PR by removing whitespaces. Bug 17450. --- cparser/Elab.ml | 48 ++++++++++++++++++++++++------------------------ 1 file changed, 24 insertions(+), 24 deletions(-) (limited to 'cparser/Elab.ml') diff --git a/cparser/Elab.ml b/cparser/Elab.ml index 4d3d1d02..0e445b9d 100644 --- a/cparser/Elab.ml +++ b/cparser/Elab.ml @@ -103,7 +103,7 @@ let elab_funbody_f : (C.typ -> Env.t -> statement -> C.stmt) ref (** * Elaboration of constants - C99 section 6.4.4 *) -let has_suffix s suff = +let has_suffix s suff = let ls = String.length s and lsuff = String.length suff in ls >= lsuff && String.sub s (ls - lsuff) lsuff = suff @@ -111,7 +111,7 @@ let chop_last s n = assert (String.length s >= n); String.sub s 0 (String.length s - n) -let has_prefix s pref = +let has_prefix s pref = let ls = String.length s and lpref = String.length pref in ls >= lpref && String.sub s 0 lpref = pref @@ -195,7 +195,7 @@ let elab_int_constant loc s0 = in (* Find smallest allowable type that fits *) let ty = - try List.find (fun ty -> integer_representable v ty) + try List.find (fun ty -> integer_representable v ty) (if base = 10 then dec_kinds else hex_kinds) with Not_found -> error loc "integer literal '%s' cannot be represented" s0; @@ -224,7 +224,7 @@ let elab_char_constant loc wide chars = let max_digit = Int64.shift_left 1L nbits in let max_val = Int64.shift_left 1L (64 - nbits) in let v = - List.fold_left + List.fold_left (fun acc d -> if acc < 0L || acc >= max_val then error loc "character constant overflows"; @@ -243,7 +243,7 @@ let elab_char_constant loc wide chars = IInt) let elab_string_literal loc wide chars = - let nbits = if wide then 8 * !config.sizeof_wchar else 8 in + let nbits = if wide then 8 * !config.sizeof_wchar else 8 in let char_max = Int64.shift_left 1L nbits in List.iter (fun c -> @@ -390,7 +390,7 @@ let rec elab_specifier ?(only = false) loc env specifier = let sto = ref Storage_default and inline = ref false and attr = ref [] - and tyspecs = ref [] + and tyspecs = ref [] and typedef = ref false in let do_specifier = function @@ -404,7 +404,7 @@ let rec elab_specifier ?(only = false) loc env specifier = | STATIC -> sto := Storage_static | EXTERN -> sto := Storage_extern | REGISTER -> sto := Storage_register - | TYPEDEF -> + | TYPEDEF -> if !typedef then error loc "multiple uses of 'typedef'"; typedef := true @@ -590,7 +590,7 @@ and elab_name env spec (Name (id, decl, attr, loc)) = let (sto, inl, tydef, bty, env') = elab_specifier loc env spec in if tydef then error loc "'typedef' is forbidden here"; - let (ty, env'') = elab_type_declarator loc env' bty decl in + let (ty, env'') = elab_type_declarator loc env' bty decl in let a = elab_attributes env attr in (id, sto, inl, add_attributes_type a ty, env'') @@ -605,7 +605,7 @@ and elab_name_group loc env (spec, namelist) = error loc "'inline' is forbidden here"; let elab_one_name env (Name (id, decl, attr, loc)) = let (ty, env1) = - elab_type_declarator loc env bty decl in + elab_type_declarator loc env bty decl in let a = elab_attributes env attr in ((id, add_attributes_type a ty), env1) in (mmap elab_one_name env' namelist, sto) @@ -617,7 +617,7 @@ and elab_init_name_group loc env (spec, namelist) = elab_specifier ~only:(namelist=[]) loc env spec in let elab_one_name env (Init_name (Name (id, decl, attr, loc), init)) = let (ty, env1) = - elab_type_declarator loc env bty decl in + elab_type_declarator loc env bty decl in let a = elab_attributes env attr in if inl && not (is_function_type env ty) then error loc "'inline' can only appear on functions"; @@ -681,7 +681,7 @@ and elab_field_group env (Field_group (spec, fieldlist, loc)) = error loc "bit size of '%s' is not a compile-time constant" id; None end in - { fld_name = id; fld_typ = ty; fld_bitfield = optbitsize' } + { fld_name = id; fld_typ = ty; fld_bitfield = optbitsize' } in (List.map2 elab_bitfield fieldlist names, env') @@ -818,7 +818,7 @@ and elab_enum only loc tag optmembers attrs env = let elab_type loc env spec decl = let (sto, inl, tydef, bty, env') = elab_specifier loc env spec in - let (ty, env'') = elab_type_declarator loc env' bty decl in + let (ty, env'') = elab_type_declarator loc env' bty decl in if sto <> Storage_default || inl || tydef then error loc "'typedef', 'extern', 'static', 'register' and 'inline' are meaningless in cast"; (ty, env'') @@ -977,7 +977,7 @@ module I = struct if fld.fld_name = fld1.fld_name then i else default_init env fld1.fld_typ) - end + end | (TStruct _ | TUnion _), Init_single a -> (* This is a previous whole-struct initialization that we are going to overwrite. Revert to the default initializer. *) @@ -990,7 +990,7 @@ module I = struct let index env (z, i as zi) n = match unroll env (typeof zi), i with | TArray(ty, sz, _), Init_array il -> - if n >= 0L && index_below n sz then begin + if n >= 0L && index_below n sz then begin let dfl = default_init env ty in let rec loop p before after = if p = n then @@ -1044,7 +1044,7 @@ end let rec elab_designator loc env zi desig = match desig with - | [] -> + | [] -> zi | INFIELD_INIT name :: desig' -> begin match I.member env zi name with @@ -1103,7 +1103,7 @@ let rec elab_list zi il first = and elab_item zi item il = let ty = I.typeof zi in match item, unroll env ty with - (* Special case char array = "string literal" + (* Special case char array = "string literal" or wchar array = L"wide string literal" *) | (SINGLE_INIT (CONSTANT (CONST_STRING(w, s))) | COMPOUND_INIT [_, SINGLE_INIT(CONSTANT (CONST_STRING(w, s)))]), @@ -1737,8 +1737,8 @@ let elab_expr loc env a = match args, params with | [], [] -> [] | [], _::_ -> err "not enough arguments in function call"; [] - | _::_, [] -> - if vararg + | _::_, [] -> + if vararg then args else (err "too many arguments in function call"; args) | arg1 :: argl, (_, ty_p) :: paraml -> @@ -1773,7 +1773,7 @@ let elab_for_expr loc env = function (* Handling of __func__ (section 6.4.2.2) *) -let __func__type_and_init s = +let __func__type_and_init s = (TArray(TInt(IChar, [AConst]), Some(Int64.of_int (String.length s + 1)), []), init_char_array_string None s) @@ -1894,7 +1894,7 @@ let elab_fundef env spec name body loc = (* Extract info from type *) let (ty_ret, params, vararg, attr) = match ty with - | TFun(ty_ret, Some params, vararg, attr) -> + | TFun(ty_ret, Some params, vararg, attr) -> if wrap incomplete_type loc env1 ty_ret && not (is_void_type env ty_ret) then fatal_error loc "return type is an incomplete type"; (ty_ret, params, vararg, attr) @@ -1997,7 +1997,7 @@ let rec elab_definition (local: bool) (env: Env.t) (def: Cabs.definition) (* "int x = 12, y[10], *z" *) | DECDEF(init_name_group, loc) -> - let ((dl, env1), sto, tydef) = + let ((dl, env1), sto, tydef) = elab_init_name_group loc env init_name_group in if tydef then let env2 = enter_typedefs loc env1 sto dl @@ -2101,7 +2101,7 @@ let rec elab_stmt env ctx s = if not (is_scalar_type env a'.etyp) then error loc "the condition of 'if' does not have scalar type"; let s1' = elab_stmt env ctx s1 in - let s2' = + let s2' = match s2 with | None -> sskip | Some s2 -> elab_stmt env ctx s2 @@ -2134,12 +2134,12 @@ let rec elab_stmt env ctx s = | Some (FC_DECL def) -> let (dcl, env') = elab_definition true (Env.new_scope env) def in let loc = elab_loc (get_definitionloc def) in - (sskip, env', + (sskip, env', Some(List.map (fun d -> {sdesc = Sdecl d; sloc = loc}) dcl)) in let a2' = match a2 with | None -> intconst 1L IInt - | Some a2 -> elab_expr loc env' a2 + | Some a2 -> elab_expr loc env' a2 in if not (is_scalar_type env' a2'.etyp) then error loc "the condition of 'for' does not have scalar type"; -- cgit