diff --git a/gcc/ChangeLog b/gcc/ChangeLog index 771a4a2e6b8859aebe310287db5bbe38a8441973..9c75318941369e5f4491b7ae10c6e18566f695ce 100644 --- a/gcc/ChangeLog +++ b/gcc/ChangeLog @@ -1,3 +1,8 @@ +2011-11-01 Paolo Carlini <paolo.carlini@oracle.com> + + PR c++/44277 + * doc/invoke.texi: Document -Wzero-as-null-pointer-constant. + 2011-11-01 Andrew Stubbs <ams@codesourcery.com> * config/arm/bpabi.h (BE8_LINK_SPEC): Recognize generic-armv7 tuning. diff --git a/gcc/c-family/ChangeLog b/gcc/c-family/ChangeLog index 028163ccefbd837d3926470c9b9ebbba4b4fe48e..472ed282d5e08452ebc904e0dc5dc9b0595cb8d7 100644 --- a/gcc/c-family/ChangeLog +++ b/gcc/c-family/ChangeLog @@ -1,3 +1,8 @@ +2011-11-01 Paolo Carlini <paolo.carlini@oracle.com> + + PR c++/44277 + * c.opt: Add Wzero-as-null-pointer-constant. + 2011-10-31 Jason Merrill <jason@redhat.com> * c.opt (-fdeduce-init-list): Off by default. diff --git a/gcc/c-family/c.opt b/gcc/c-family/c.opt index 6d5009758986d754cbece8cd18c044baad25a50a..438b8b003e9bbec9d18d3bd3a8e3dbe4db022b82 100644 --- a/gcc/c-family/c.opt +++ b/gcc/c-family/c.opt @@ -689,6 +689,10 @@ Wpointer-sign C ObjC Var(warn_pointer_sign) Init(-1) Warning Warn when a pointer differs in signedness in an assignment +Wzero-as-null-pointer-constant +C++ ObjC++ Var(warn_zero_as_null_pointer_constant) Warning +Warn when a literal '0' is used as null pointer + ansi C ObjC C++ ObjC++ A synonym for -std=c89 (for C) or -std=c++98 (for C++) diff --git a/gcc/cp/ChangeLog b/gcc/cp/ChangeLog index 1b40250b4219943ed0de9a59c9504046fc08c754..f7328db2bd19d895e81c3731f0f0dc065d966d33 100644 --- a/gcc/cp/ChangeLog +++ b/gcc/cp/ChangeLog @@ -1,3 +1,16 @@ +2011-11-01 Paolo Carlini <paolo.carlini@oracle.com> + + PR c++/44277 + * cvt.c (cp_convert_to_pointer): Warn for zero as null pointer + constant. + * typeck.c (cp_truthvalue_conversion): Handle pointers and member + function pointers under c_inhibit_evaluation_warnings; use + nullptr_node for data member pointers. + (cp_build_binary_op): Tweak, just forward to cp_convert op1, + either a nullptr_node or an integer_zero_node. + (build_ptrmemfunc): Use nullptr_node. + * init.c (build_zero_init_1): Likewise. + 2011-11-01 Jason Merrill <jason@redhat.com> PR c++/50500 diff --git a/gcc/cp/cvt.c b/gcc/cp/cvt.c index 3e618d320adc4042a28d492182b4cc558f4b31c6..8570e3d45028fd0a47e91521d21bc8a7bcb2b99a 100644 --- a/gcc/cp/cvt.c +++ b/gcc/cp/cvt.c @@ -198,6 +198,11 @@ cp_convert_to_pointer (tree type, tree expr) if (null_ptr_cst_p (expr)) { + if (c_inhibit_evaluation_warnings == 0 + && !NULLPTR_TYPE_P (TREE_TYPE (expr))) + warning (OPT_Wzero_as_null_pointer_constant, + "zero as null pointer constant"); + if (TYPE_PTRMEMFUNC_P (type)) return build_ptrmemfunc (TYPE_PTRMEMFUNC_FN_TYPE (type), expr, 0, /*c_cast_p=*/false, tf_warning_or_error); diff --git a/gcc/cp/init.c b/gcc/cp/init.c index 9115df3dba692e6da7729bd0df6eab2a52e1ebf9..6b57eb60a6543eb852bebd97658ee707acbaa3a9 100644 --- a/gcc/cp/init.c +++ b/gcc/cp/init.c @@ -176,6 +176,8 @@ build_zero_init_1 (tree type, tree nelts, bool static_storage_p, items with static storage duration that are not otherwise initialized are initialized to zero. */ ; + else if (TYPE_PTR_P (type) || TYPE_PTR_TO_MEMBER_P (type)) + init = convert (type, nullptr_node); else if (SCALAR_TYPE_P (type)) init = convert (type, integer_zero_node); else if (CLASS_TYPE_P (type)) diff --git a/gcc/cp/typeck.c b/gcc/cp/typeck.c index ec14934a8232ccd6b1e92ab2507566e201d438c5..8d70df5eb75f158c42b7ecf9018d12417dbac5f0 100644 --- a/gcc/cp/typeck.c +++ b/gcc/cp/typeck.c @@ -4058,7 +4058,7 @@ cp_build_binary_op (location_t location, else { op0 = build_ptrmemfunc_access_expr (op0, pfn_identifier); - op1 = cp_convert (TREE_TYPE (op0), integer_zero_node); + op1 = cp_convert (TREE_TYPE (op0), op1); } result_type = TREE_TYPE (op0); } @@ -4668,7 +4668,17 @@ cp_truthvalue_conversion (tree expr) tree type = TREE_TYPE (expr); if (TYPE_PTRMEM_P (type)) return build_binary_op (EXPR_LOCATION (expr), - NE_EXPR, expr, integer_zero_node, 1); + NE_EXPR, expr, nullptr_node, 1); + else if (TYPE_PTR_P (type) || TYPE_PTRMEMFUNC_P (type)) + { + /* With -Wzero-as-null-pointer-constant do not warn for an + 'if (p)' or a 'while (!p)', where p is a pointer. */ + tree ret; + ++c_inhibit_evaluation_warnings; + ret = c_common_truthvalue_conversion (input_location, expr); + --c_inhibit_evaluation_warnings; + return ret; + } else return c_common_truthvalue_conversion (input_location, expr); } @@ -7148,7 +7158,7 @@ build_ptrmemfunc (tree type, tree pfn, int force, bool c_cast_p, /* Handle null pointer to member function conversions. */ if (null_ptr_cst_p (pfn)) { - pfn = build_c_cast (input_location, type, integer_zero_node); + pfn = build_c_cast (input_location, type, nullptr_node); return build_ptrmemfunc1 (to_type, integer_zero_node, pfn); diff --git a/gcc/doc/invoke.texi b/gcc/doc/invoke.texi index 2836b74cb6540f2663b71c775bea66d57a47ef52..b68f607912e22d173d0002ec94ea8473536b95ea 100644 --- a/gcc/doc/invoke.texi +++ b/gcc/doc/invoke.texi @@ -4142,6 +4142,12 @@ unsigned integers are disabled by default in C++ unless Do not warn for conversions between @code{NULL} and non-pointer types. @option{-Wconversion-null} is enabled by default. +@item -Wzero-as-null-pointer-constant @r{(C++ and Objective-C++ only)} +@opindex Wzero-as-null-pointer-constant +@opindex Wno-zero-as-null-pointer-constant +Warn when a literal '0' is used as null pointer constant. This can +be useful to facilitate the conversion to @code{nullptr} in C++11. + @item -Wempty-body @opindex Wempty-body @opindex Wno-empty-body diff --git a/gcc/testsuite/ChangeLog b/gcc/testsuite/ChangeLog index a1079322db2fd8f9d602b7b66227c84d45dc7803..bdbdb8e7b1988e73a96e25adf87bf3c9ecbe7ce6 100644 --- a/gcc/testsuite/ChangeLog +++ b/gcc/testsuite/ChangeLog @@ -1,3 +1,9 @@ +2011-11-01 Paolo Carlini <paolo.carlini@oracle.com> + + PR c++/44277 + * g++.dg/warn/Wzero-as-null-pointer-constant-1.C: New. + * g++.dg/cpp0x/Wzero-as-null-pointer-constant-1.C: Likewise. + 2011-11-01 Tom de Vries <tom@codesourcery.com> PR tree-optimization/50908 diff --git a/gcc/testsuite/g++.dg/cpp0x/Wzero-as-null-pointer-constant-1.C b/gcc/testsuite/g++.dg/cpp0x/Wzero-as-null-pointer-constant-1.C new file mode 100644 index 0000000000000000000000000000000000000000..aad273792ac9245768724a602f10c88c1d783b36 --- /dev/null +++ b/gcc/testsuite/g++.dg/cpp0x/Wzero-as-null-pointer-constant-1.C @@ -0,0 +1,161 @@ +// { dg-options "-std=c++0x -Wzero-as-null-pointer-constant" } + +struct A; + +typedef int (A::*pointmemfun) (int); +typedef int (A::*pointdmem); +typedef int (*pointfun) (int); + +pointmemfun pmfs; +pointdmem pdms; +pointfun pfs; +int* ps; + +void f() +{ + pointmemfun pmf(0); // { dg-warning "zero as null pointer" } + pointdmem pdm(0); // { dg-warning "zero as null pointer" } + pointfun pf(0); // { dg-warning "zero as null pointer" } + int* p(0); // { dg-warning "zero as null pointer" } + + pointmemfun pmfn(nullptr); + pointdmem pdmn(nullptr); + pointfun pfn(nullptr); + int* pn(nullptr); + + pmf = 0; // { dg-warning "zero as null pointer" } + + pdm = 0; // { dg-warning "zero as null pointer" } + + pf = 0; // { dg-warning "zero as null pointer" } + + p = 0; // { dg-warning "zero as null pointer" } + + pmf = nullptr; + + pdm = nullptr; + + pf = nullptr; + + p = nullptr; + + if (pmf) + ; + + if (pdm) + ; + + if (pf) + ; + + if (p) + ; + + if (!pmf) + ; + + if (!pdm) + ; + + if (!pf) + ; + + if (!p) + ; + + if (pmf == 0) // { dg-warning "zero as null pointer" } + ; + + if (pdm == 0) // { dg-warning "zero as null pointer" } + ; + + if (pf == 0) // { dg-warning "zero as null pointer" } + ; + + if (p == 0) // { dg-warning "zero as null pointer" } + ; + + if (0 == pmf) // { dg-warning "zero as null pointer" } + ; + + if (0 == pdm) // { dg-warning "zero as null pointer" } + ; + + if (0 == pf) // { dg-warning "zero as null pointer" } + ; + + if (0 == p) // { dg-warning "zero as null pointer" } + ; + + if (pmf != 0) // { dg-warning "zero as null pointer" } + ; + + if (pdm != 0) // { dg-warning "zero as null pointer" } + ; + + if (pf != 0) // { dg-warning "zero as null pointer" } + ; + + if (p != 0) // { dg-warning "zero as null pointer" } + ; + + if (0 != pmf) // { dg-warning "zero as null pointer" } + ; + + if (0 != pdm) // { dg-warning "zero as null pointer" } + ; + + if (0 != pf) // { dg-warning "zero as null pointer" } + ; + + if (0 != p) // { dg-warning "zero as null pointer" } + ; + + if (pmf == nullptr) + ; + + if (pdm == nullptr) + ; + + if (pf == nullptr) + ; + + if (p == nullptr) + ; + + if (nullptr == pmf) + ; + + if (nullptr == pdm) + ; + + if (nullptr == pf) + ; + + if (nullptr == p) + ; + + if (pmf != nullptr) + ; + + if (pdm != nullptr) + ; + + if (pf != nullptr) + ; + + if (p != nullptr) + ; + + if (nullptr != pmf) + ; + + if (nullptr != pdm) + ; + + if (nullptr != pf) + ; + + if (nullptr != p) + ; +} diff --git a/gcc/testsuite/g++.dg/warn/Wzero-as-null-pointer-constant-1.C b/gcc/testsuite/g++.dg/warn/Wzero-as-null-pointer-constant-1.C new file mode 100644 index 0000000000000000000000000000000000000000..d0f62b212ec5de6738c6de0e91120caef16f54d9 --- /dev/null +++ b/gcc/testsuite/g++.dg/warn/Wzero-as-null-pointer-constant-1.C @@ -0,0 +1,100 @@ +// { dg-options "-Wzero-as-null-pointer-constant" } + +struct A; + +typedef int (A::*pointmemfun) (int); +typedef int (A::*pointdmem); +typedef int (*pointfun) (int); + +pointmemfun pmfs; +pointdmem pdms; +pointfun pfs; +int* ps; + +void f() +{ + pointmemfun pmf(0); // { dg-warning "zero as null pointer" } + pointdmem pdm(0); // { dg-warning "zero as null pointer" } + pointfun pf(0); // { dg-warning "zero as null pointer" } + int* p(0); // { dg-warning "zero as null pointer" } + + pmf = 0; // { dg-warning "zero as null pointer" } + + pdm = 0; // { dg-warning "zero as null pointer" } + + pf = 0; // { dg-warning "zero as null pointer" } + + p = 0; // { dg-warning "zero as null pointer" } + + if (pmf) + ; + + if (pdm) + ; + + if (pf) + ; + + if (p) + ; + + if (!pmf) + ; + + if (!pdm) + ; + + if (!pf) + ; + + if (!p) + ; + + if (pmf == 0) // { dg-warning "zero as null pointer" } + ; + + if (pdm == 0) // { dg-warning "zero as null pointer" } + ; + + if (pf == 0) // { dg-warning "zero as null pointer" } + ; + + if (p == 0) // { dg-warning "zero as null pointer" } + ; + + if (0 == pmf) // { dg-warning "zero as null pointer" } + ; + + if (0 == pdm) // { dg-warning "zero as null pointer" } + ; + + if (0 == pf) // { dg-warning "zero as null pointer" } + ; + + if (0 == p) // { dg-warning "zero as null pointer" } + ; + + if (pmf != 0) // { dg-warning "zero as null pointer" } + ; + + if (pdm != 0) // { dg-warning "zero as null pointer" } + ; + + if (pf != 0) // { dg-warning "zero as null pointer" } + ; + + if (p != 0) // { dg-warning "zero as null pointer" } + ; + + if (0 != pmf) // { dg-warning "zero as null pointer" } + ; + + if (0 != pdm) // { dg-warning "zero as null pointer" } + ; + + if (0 != pf) // { dg-warning "zero as null pointer" } + ; + + if (0 != p) // { dg-warning "zero as null pointer" } + ; +}