OFFSET
1,1
LINKS
Christian N. K. Anderson, Table of n, a(n) for n = 1..10000
EXAMPLE
5^3 + 6^3 + 1^3 + 1^3 = 343, which is 7^3.
MATHEMATICA
fQ[n_] := Module[{d = IntegerDigits[n]}, Count[d, 0] + 1 < Length[d] && IntegerQ[Total[d^3]^(1/3)]]; Select[Range[5611], fQ] (* T. D. Noe, May 19 2013 *)
PROG
(R)y=rep(0, 10000); len=0; x=0; library(gmp);
digcubesum<-function(x) sum(as.numeric(unlist(strsplit(as.character(as.bigz(x)), split="")))^3);
iscube<-function(x) ifelse(as.bigz(x)<2, T, all(table(as.numeric(factorize(x)))%%3==0));
nonzerodig<-function(x) sum(strsplit(as.character(x), split="")[[1]]!="0");
which(sapply(1:6000, function(x) nonzerodig(x)>1 & iscube(digcubesum(x))))
CROSSREFS
Cf. A164882 (n such that sum of the cubes of the digits of n^3 is perfect cube). - Zak Seidov, May 21 2013
KEYWORD
nonn,base
AUTHOR
Kevin L. Schwartz and Christian N. K. Anderson, May 10 2013
STATUS
approved